使用R中的IF语句为数值变量赋值

使用R中的IF语句为数值变量赋值,r,if-statement,na,R,If Statement,Na,我有一个函数可以计算两个数据集中的行(基于相同的列)之间的差异。下面是一个示例和函数 ################# ## Sample ## ################# # data frame for recipients IDr= c(seq(1,4)) Blood_type_r=c("A","B","AB","O") data_R=data.frame(IDr,Blood_type_

我有一个函数可以计算两个数据集中的行(基于相同的列)之间的差异。下面是一个示例和函数

#################
##   Sample    ##
#################

# data frame for recipients

IDr= c(seq(1,4))
Blood_type_r=c("A","B","AB","O")
data_R=data.frame(IDr,Blood_type_r,A=rep(0,4),B=c(rep(0,3),1),C=c(rep(1,3),0),D=rep(1,4),E=c(rep(0,2),rep(1,1),0),stringsAsFactors=FALSE)

  data_R
  IDr Blood_type_r A B C D E
1   1            A 0 0 1 1 0
2   2            B 0 0 1 1 0
3   3           AB 0 0 1 1 1
4   4            O 0 1 0 1 0

# data frame for donors 

IDd= c(seq(1,8))
Blood_type_d= c(rep("A", each=2),rep("B", each=2),rep("AB", each=2),rep("O", each=2))
WD= c(rep(0.25, each=2),rep(0.125, each=2),rep(0.125, each=2),rep(0.5, each=2))
data_D=data.frame(IDd,Blood_type_d,A=c(rep(0,6),1,1),B=c(rep(0,6),1,1),C=c(rep(1,7),0),D=rep(1,8),E=c(rep(0,6),rep(1,1),0),WD,stringsAsFactors=FALSE)
  data_D
  IDd Blood_type_d A B C D E    WD
1   1            A 0 0 1 1 0 0.250
2   2            A 0 0 1 1 0 0.250
3   3            B 0 0 1 1 0 0.125
4   4            B 0 0 1 1 0 0.125
5   5           AB 0 0 1 1 0 0.125
6   6           AB 0 0 1 1 0 0.125
7   7            O 1 1 1 1 1 0.500
8   8            O 1 1 0 1 0 0.500

# function
soustraction.i=function(D,R,i,threshold){
  D=as.data.frame(D)
  R=as.data.frame(R)
  dif=map2_df(D, R[i,], `-`)
  dif[dif<0] = 0
  dif$mismatch=rowSums(dif)
  dif=dif[which(dif$mismatch <= threshold),]
  return(dif)
  
}

 soustraction.i(data_D[,3:7],data_R[,3:7],1,3)
# A tibble: 8 x 6
      A     B     C     D     E mismatch
  <dbl> <dbl> <dbl> <dbl> <dbl>    <dbl>
1     0     0     0     0     0        0
2     0     0     0     0     0        0
3     0     0     0     0     0        0
4     0     0     0     0     0        0
5     0     0     0     0     0        0
6     0     0     0     0     0        0
7     1     1     0     0     1        3
8     1     1     0     0     0        2

我失去了2名患者,我希望分配一个
NA
值。因此,输出将是

# Desired output 
# A tibble: 8 x 6
      A     B     C     D     E mismatch
  <dbl> <dbl> <dbl> <dbl> <dbl>    <dbl>
1     0     0     0     0     0        0
2     0     0     0     0     0        0
3     0     0     0     0     0        0
4     0     0     0     0     0        0
5     0     0     0     0     0        0
6     0     0     0     0     0        0
7     1     1     0     0     1        NA
8     1     1     0     0     0        NA
#所需输出
#一个tibble:8x6
A、B、C、D、E不匹配
1     0     0     0     0     0        0
2     0     0     0     0     0        0
3     0     0     0     0     0        0
4     0     0     0     0     0        0
5     0     0     0     0     0        0
6     0     0     0     0     0        0
711001NA
81100NA
这是我迄今为止所做的尝试,它给了我一个警告,并没有做正确的事情

soustraction.j=function(D,R,i,threshold){
  D=as.data.frame(D)
  R=as.data.frame(R)
  dif=map2_df(D, R[i,], `-`)
  dif[dif<0] = 0
  dif$mismatch=rowSums(dif)
  if(threshold==0){
    if(dif$mismatch > 0){
      dif$mismatch= NA
    }
  }else{
    dif=dif[which(dif$mismatch <= threshold),]
  }
 
  return(dif)
  
}
soustraction.j(data_D[,3:7],data_R[,3:7],1,0)
# A tibble: 8 x 6
      A     B     C     D     E mismatch
  <dbl> <dbl> <dbl> <dbl> <dbl>    <dbl>
1     0     0     0     0     0        0
2     0     0     0     0     0        0
3     0     0     0     0     0        0
4     0     0     0     0     0        0
5     0     0     0     0     0        0
6     0     0     0     0     0        0
7     1     1     0     0     1        3
8     1     1     0     0     0        2

#Warning message:
#In if (dif$mismatch > 0) { :
 # the condition has length > 1 and only the first element will be used
soutraction.j=函数(D,R,i,阈值){
D=as.data.frame(D)
R=as.data.frame(R)
dif=map2_-df(D,R[i,],`-`)
dif[dif 0){
dif$不匹配=NA
}
}否则{
dif=dif[其中(dif$0){:
#条件的长度大于1,并且只使用第一个元素

提前感谢您的帮助

如果
不匹配
大于
阈值
,您可以将行的子集分配给
NA

soustraction.i=function(D,R,i,threshold){
  D=as.data.frame(D)
  R=as.data.frame(R)
  dif= purrr::map2_df(D, R[i,], `-`)
  dif[dif<0] = 0
  dif$mismatch=rowSums(dif)
  dif$mismatch[dif$mismatch > threshold] <- NA
  return(dif)
}
soutraction.i=函数(D,R,i,阈值){
D=as.data.frame(D)
R=as.data.frame(R)
dif=purrr::map2_-df(D,R[i,],`-`)

dif[dif threshold]您可以将行的子集分配给
NA
,其中
不匹配
大于
阈值

soustraction.i=function(D,R,i,threshold){
  D=as.data.frame(D)
  R=as.data.frame(R)
  dif= purrr::map2_df(D, R[i,], `-`)
  dif[dif<0] = 0
  dif$mismatch=rowSums(dif)
  dif$mismatch[dif$mismatch > threshold] <- NA
  return(dif)
}
soutraction.i=函数(D,R,i,阈值){
D=as.data.frame(D)
R=as.data.frame(R)
dif=purrr::map2_-df(D,R[i,],`-`)

dif[dif threshold]这里有一个
dplyr
解决方案。它应该适用于
threshold==0
时,并推广到其他阈值:

soustraction.i=function(D,R,i,threshold){
  D=as.data.frame(D)
  R=as.data.frame(R)
  dif=map2_df(D, R[i,], `-`)
  dif[dif<0] = 0
  dif$mismatch=rowSums(dif)
  dif <- dif %>%
    mutate(mismatch = case_when(mismatch > threshold ~ NA_real_,
                                TRUE ~ mismatch))
return(dif)
}

下面是一个
dplyr
解决方案。它应该适用于
threshold==0
时,并推广到其他阈值:

soustraction.i=function(D,R,i,threshold){
  D=as.data.frame(D)
  R=as.data.frame(R)
  dif=map2_df(D, R[i,], `-`)
  dif[dif<0] = 0
  dif$mismatch=rowSums(dif)
  dif <- dif %>%
    mutate(mismatch = case_when(mismatch > threshold ~ NA_real_,
                                TRUE ~ mismatch))
return(dif)
}

谢谢@latlio的回复!这就是我想要的。我很感激。谢谢@latlio的回复!这就是我想要的。我很感激。
soustraction.i(data_D[,3:7],data_R[,3:7],1,0)

# A tibble: 8 x 6
      A     B     C     D     E mismatch
  <dbl> <dbl> <dbl> <dbl> <dbl>    <dbl>
1     0     0     0     0     0        0
2     0     0     0     0     0        0
3     0     0     0     0     0        0
4     0     0     0     0     0        0
5     0     0     0     0     0        0
6     0     0     0     0     0        0
7     1     1     0     0     1       NA
8     1     1     0     0     0       NA

soustraction.i <- function(D,R,i,threshold){
  D <- as_tibble(D)
  R <- as_tibble(R)
  dif <- map2_df(D, R[i,], `-`) %>%
    mutate(across(everything(), ~ifelse(.x < 0, 0, .x))) %>%
    rowwise() %>%
    mutate(mismatch = sum(c_across(everything())),
           mismatch = case_when(as.numeric(mismatch) > threshold ~ NA_real_,
                                TRUE ~ mismatch))
  return(dif)
}