简体   繁体   中英

Mutate a value across several columns using dplyr selectors only

I want to calculate the sd for several columns inside a data frame without leaving my dplyr pipe. In the past, I have done this by defaulting to base r. I haven't been able to find a solution here that works.

It may help to provide some context. This is a process I do to validate survey data. We measure the sd of matrix questions to identify straight-liners. An sd of zero across the columns flags a straight line. In the past, I calculated this in base R as follows:

apply(x, 1, sd)

I know there has to be a way to do this within a dplyr pipe. I've tried several options including pmap and various approaches at mutate_at. Here's my latest attempt:

library(tidyverse)

set.seed(858465)
scale_points <- c(1:5)
q1 <- sample(scale_points, replace = TRUE, size = 100)
q2 <- sample(scale_points, replace = TRUE, size = 100)
q3 <- sample(scale_points, replace = TRUE, size = 100)


digits = 0:9
createRandString<- function() {
  v = c(sample(LETTERS, 5, replace = TRUE),
        sample(digits, 4, replace = TRUE),
        sample(LETTERS, 1, replace = TRUE))
  return(paste0(v,collapse = ""))
}

s_data <- tibble::tibble(resp_id = 100)
for(i in c(1:100)) {
  s_data[i,1] <- createRandString()
}

s_data <- bind_cols(s_data, q1 = q1, q2 = q2, q3 = q3)

s_data %>% mutate(vars(starts_with("q"), ~sd(.)))

In a perfect world, I would keep the resp_id variable in the output so that I could generate a report using filter to identify the respondent IDs with sd == 0.

Any help is greatly appreciated!

If we need a rowwise sd,

library(tidyverse)
s_data %>% 
   mutate(sdQs =  select(., starts_with("q")) %>% 
                           pmap_dbl(~ sd(c(...)))) %>% 
   filter(sdQs == 0)
# A tibble: 9 x 5
#  resp_id       q1    q2    q3  sdQs
#  <chr>      <int> <int> <int> <dbl>
#1 JORTY8990R     3     3     3     0
#2 TFYAF4729I     5     5     5     0
#3 VPUYC0789H     4     4     4     0
#4 LHAPM6293X     1     1     1     0
#5 FZQRQ8530P     3     3     3     0
#6 TKTJU3757T     5     5     5     0
#7 AYVHO1309H     4     4     4     0
#8 BBPTZ4822E     5     5     5     0
#9 NGLXT1705B     3     3     3     0

Or another option is rowSds from matrixStats

library(matrixStats)
s_data %>% 
    mutate(sdQs = rowSds(as.matrix(.[startsWith(names(.), "q")])))

The technical post webpages of this site follow the CC BY-SA 4.0 protocol. If you need to reprint, please indicate the site URL or the original address.Any question please contact:yoyou2525@163.com.

 
粤ICP备18138465号  © 2020-2024 STACKOOM.COM