R中没有夜晚的行之间的时差

时间:2018-05-13 20:55:31

标签: r time-series

在几天内在几个时间点测量受试者。我有一行“resptime_s”(主题在他的智能手机上响起哔哔声的时间)。现在我想知道它们之间的平均时间(因此在这一列的行之间)和晚上的时间(夜晚总是从晚上22:30到早上7:30)。举个例子:

R脚本:

 setwd("C:/Users/Hanne/Desktop/")
 dat <- read.csv(file="datnew2.csv", sep=";",header=TRUE)
 rows <- c(1:388) #time points
 columns <- c(2,60) # datum and time
 nVariables = 2
 newdata<-dat[rows,columns]
 head(newdata)
 fun2 <- function(x){
      bt <- as.integer(sub("(^\\d{1,2}):.*", "\\1", x))
      f <- cumsum(c(FALSE, diff(bt) < 0))
      d <- rep(as.Date("2018-01-01"), length.out = length(bt))
      bt <- as.POSIXct(paste(d, x))
      res <- sapply(split(bt, f), function(b) c(0, difftime(b[-1], b[1])))
      unname(unlist(res))
    }
fun2(newdata$resptime_s)

但结果不正确。

并且:

 dput(head(newdata, 30))

我获得了这个输出: printscreen

3 个答案:

答案 0 :(得分:1)

lubridate中使用不同的函数处理时间间隔可以提供最优雅且易于理解的解决方案。

library(tidyverse)
library(lubridate)

data <- tribble(
  ~time_point,    ~beeptime,
  1,             "08:30",
  2,             "11:13",
  3,             "12:08",
  4,             "17:20",
  5,             "22:47",
  6,             "7:36",
  7,             "9:40"
) %>%
  mutate(beeptime = as_datetime(hm(beeptime)))

<强> 1。定义白天间隔

day <- interval(
  as_datetime(hm("07:30")),
  as_datetime(hm("22:30"))
)

<强> 2。保持白天的哔哔声并估计它们之间的时间(间隔)

# %--% is basically the same as interval() above.
data_interval <-
  data %>%
  filter(beeptime %within% day) %>%
  mutate(beep_interval = lag(beeptime) %--% beeptime)

第3。取平均值

# You can use as.numeric() to extract (e.g.) minutes, which you can
# just pass to mean().
data_interval$beep_interval %>%
  as.numeric("minutes") %>%
  abs() %>%
  mean(na.rm = TRUE)

#> [1] 247.6

答案 1 :(得分:0)

尝试以下方法。它会粘贴一个日期,每当下一个小时小于前一个小时时,该日期会递增。然后difftime按预期工作。

fun <- function(x){
    bt <- as.integer(sub("(^\\d{1,2}):.*", "\\1", x))
    inx <- as.logical(cumsum(c(FALSE, diff(bt) < 0)))
    d <- rep(as.Date("2018-01-01"), length.out = length(bt))
    d[inx] <- d[inx] + 1

    beeptime <- as.POSIXct(paste(d, x))
    difftime(beeptime[-1], beeptime[1])
}

fun(newdata$beeptime)
#Time differences in hours
#[1]  2.716667  3.633333  8.833333 14.283333 23.100000 25.166667

数据。

newdata <-
structure(list(time_point = 1:7, beeptime = structure(1:7, .Label = c("08:30", 
"11:13", "12:08", "17:20", "22:47", "7:36", "9:40"), class = "factor")), class = "data.frame", row.names = c(NA, 
-7L))

修改。

我相信我错过了这个问题。 OP不希望第一个小时和所有其他小时之间存在差异。我们需要的是每晚从重新启动的差异

如果是这种情况,以下功能将执行此操作。

fun2 <- function(x){
    bt <- as.integer(sub("(^\\d{1,2}):.*", "\\1", x))
    f <- cumsum(c(FALSE, diff(bt) < 0))
    d <- rep(as.Date("2018-01-01"), length.out = length(bt))
    bt <- as.POSIXct(paste(d, x))

    res <- sapply(split(bt, f), function(b) c(0, difftime(b[-1], b[1])))
    unname(unlist(res))
}

fun2(newdata$beeptime)
#[1]  0.000000  2.716667  3.633333  8.833333 14.283333  0.000000  2.066667

答案 2 :(得分:-1)

另一种方法可能是使用beeptime包从midnight转换lubridate偏移量(以秒为单位)。

然后我们可以编写一个函数来计算不包括夜间时间的时间差(22:30 - 7:30)。

在我们开始解决之前,让我们看一下7:30 and 22:30午夜的偏移量。

library(lubridate)
as.numeric(seconds(hm("7:30")))
# [1] 27000
as.numeric(seconds(hm("22:30")))
# [1] 81000

我写了两组函数来计算两次之间的差异:

# Function checks individual time and shifts them to night boundary. So that 
# time over night can be excluded. 
checkNightBoundry <- function(val){
  if(val < 27000){
    val = 27000
  } else if(val > 81000) {
    val = 81000
  }
  val
}

# Arguments are offset from midnight in seconds  
# Calculate difference between two time, excluding midtime
calcDifftime <- function(currVal, prevVal){
  diffTime <- 0
  currVal = checkNightBoundry(currVal)
  prevVal = checkNightBoundry(prevVal)

  if(currVal > prevVal){
    diffTime = currVal - prevVal 
  }else if(currVal < prevVal){
    diffTime = (81000 - prevVal) + (currVal - 27000)
  }

  diffTime
}

现在,使用上述功能:

library(dplyr)
library(lubridate)

df %>% mutate(beeptimeOffset = as.numeric(seconds(hm(beeptime)))) %>%
  mutate(diffTime = mapply(calcDifftime, 
         beeptimeOffset, lag(beeptimeOffset, default = first(beeptimeOffset)))/3600) 

# timepoint  beeptime beeptimeOffset(sec) diffTime(hrs)
# 1         1    08:30          30600    0.0000000
# 2         2    11:13          40380    2.7166667
# 3         3    12:08          43680    0.9166667
# 4         4    17:20          62400    5.2000000
# 5         5    22:47          82020    5.1666667
# 6         6     7:36          27360    0.1000000
# 7         7     9:40          34800    2.0666667

数据:

df <- read.table(text = 
"timepoint    beeptime
1             08:30
2             11:13
3             12:08
4             17:20
5             22:47
6             7:36
7             9:40",
header = TRUE, stringsAsFactors = FALSE)