select highest pairs from complex table - r
I want to make a new dataframe from a selection of rows in a complex table of pairwise comparisons. I want to select the rows such that the 2 highest values of each pairwise comparison is selected.
Below is an example dataset:
dataframe <- data.frame(X1 = c("OP2413iiia","OP2413iiib","OP2413iiic","OP2645ii_a","OP2645ii_b","OP2645ii_c","OP2645ii_d","OP2645ii_e","OP3088i__a","OP5043___a","OP5043___b","OP5044___a","OP5044___b","OP5044___c","OP5046___a","OP5046___b","OP5046___c","OP5046___d","OP5046___e","OP5047___a","OP5047___b","OP5048___b","OP5048___c","OP5048___d","OP5048___e","OP5048___f","OP5048___g","OP5048___h","OP5049___a","OP5049___b","OP5051DNAa","OP5051DNAb","OP5051DNAc","OP5052DNAa","OP5053DNAa"),
gr1 = c("2","2","2","3","3","3","3","3","3","4","4","4","3","4","2","3","3","3","4","2","4","3","3","3","4","2","4","2","3","3","3","4","2","4","2"),
X2 = c("OP2413iiib","OP2413iiic","OP5046___a","OP2645ii_a","OP2645ii_a","OP2645ii_a","OP2645ii_b","OP2645ii_b","OP5046___a","OP2645ii_b","OP2645ii_c","OP2645ii_c","OP2645ii_c","OP2645ii_c","OP5048___e","OP2645ii_d","OP5046___a","OP2645ii_d","OP2645ii_d","OP2645ii_d","OP2645ii_d","OP2645ii_e","OP5048___e","OP2645ii_e","OP2645ii_e","OP2645ii_e","OP2645ii_e","OP2645ii_e","OP3088i__a","OP3088i__a","OP3088i__a","OP3088i__a","OP3088i__a","OP3088i__a","OP3088i__a"),
gr2 = c("3","3","3","4","4","4","2","2","2","2","4","4","4","4","4","2","2","2","2","2","2","4","4","4","4","4","4","4","3","3","3","3","3","3","3"),
value = c("1.610613e+00","1.609732e+00","8.829263e-04","1.080257e+01","1.111006e+01","1.110978e+01","4.048302e+00","5.610458e+00","5.609584e+00","9.911490e+00","1.078518e+01","1.133728e+01","1.133686e+01","1.738092e+00","9.247411e+00","5.170646e+00","6.074909e+00","6.074287e+00","6.212711e+00","3.769029e+00","5.793390e+00","1.124045e+01","1.163326e+01","1.163293e+01","7.752766e-01","1.008434e+01","1.222854e+00","6.469443e+00","1.610828e+00","1.784774e+00","1.784235e+00","9.434803e+00","4.512563e+00","9.582847e+00","4.309312e+00"))
expected_output_dataframe <- rbind(dataframe[10,],dataframe[34,],dataframe[32,],dataframe[15,],dataframe[3,],dataframe[17,])
Many thanks in advance
Cheers
The method works using dplyr. I created an extra column, gr_pair, to identify the pairwise groups.
library(dplyr)
library(magrittr)
dataframe %>%
filter(gr1 != gr2) %>% # This case is excluded from your expected output
mutate(gr_pair = paste(pmin(gr1, gr2), pmax(gr1, gr2), sep = ",")) %>%
group_by(gr_pair) %>%
top_n(2, value) # Keep the top two rows in each group, sorted by value
Related
How to subset a data frame by id, with sampling 1 row by id? (in R)
I have a big data frame and each row have an id code. But i want to create another data frame with only one row of each id. How can i do it? This is one part of the data (the id column is "codigo_pon"):
Using dplyr, you can do this: library(dplyr) your_data %>% group_by(id_column) %>% sample_n(1) %>% ungroup()
Based on the question, you could do somethink like this: library(tidyverse) Example data data <- tibble( id = rep(1:20,each = 5), value = rnorm(100) ) Sample data, 1 row by id data %>% #Group by id variable group_by(id) %>% #Sample 1 row by id sample_n(size = 1)
base R data[!ave(seq_len(nrow(data)), data$codigo_pon, FUN = function(z) seq_along(z) != sample(length(z), size = 1)),] or do.call(rbind, by(data, data$codigo_pon, FUN = function(z) z[sample(nrow(z), size = 1),])) (Previously I suggested aggregate, but that sampled each column separately, breaking up the rows.) data.table library(data.table) as.data.table(data)[, .SD[sample(.N, size = 1),], by = codigo_pon] (dplyr has already been demonstrated twice)
How to merge rows based on conditions with characters values? (Household data)
I have a data frame in which the first column indicates the work (manager, employee or worker), the second indicates whether the person works at night or not and the last is a household code (if two individuals share the same code then it means that they share the same house). #Here is the reproductible data : PCS <- c("worker", "manager","employee","employee","worker","worker","manager","employee","manager","employee") work_night <- c("Yes","Yes","No", "No","No","Yes","No","Yes","No","Yes") HHnum <- c(1,1,2,2,3,3,4,4,5,5) df <- data.frame(PCS,work_night,HHnum) My problem is that I would like to have a new data frame with households instead of individuals. I would like to group individuals based on HHnum and then merge their answers. For the variable "PCS" I have new categories based on the combination of answers : Manager+work ="I" ; manager+employee="II", employee+employee=VI, worker+worker=III etc For the variable "work_night", I would like to apply a score (is both answered Yes then score=2, if one answered YES then score =1 and if both answered No then score = 0). To be clear, I would like my data frame to look like this : HHnum PCS work_night 1 "I" 2 2 "VI" 0 3 "III" 1 4 "II" 1 5 "II" 1 How can I do this on R using dplyr ? I know that I need group_by() but then I don't know what to use. Best, Victor
Here is one way to do it (though I admit it is pretty verbose). I created a reference dataframe (i.e., combos) in case you had more categories than 3, which is then joined with the main dataframe (i.e., df_new) to bring in the PCS roman numerals. library(dplyr) library(tidyr) # Create a dataframe with all of the combinations of PCS. combos <- expand.grid(unique(df$PCS), unique(df$PCS)) combos <- unique(t(apply(combos, 1, sort))) %>% as.data.frame() %>% dplyr::mutate(PCS = as.roman(row_number())) # Create another dataframe with the columns reversed (will make it easier to join to the main dataframe). combos2 <- data.frame(V1 = c(combos$V2), V2 = c(combos$V1), PCS = c(combos$PCS)) %>% dplyr::mutate(PCS = as.roman(PCS)) combos <- rbind(combos, combos2) # Get the count of "Yes" for each HHnum group. # Then, put the PCS into 2 columns to join together with "combos" df. df_new <- df %>% dplyr::group_by(HHnum) %>% dplyr::mutate(work_night = sum(work_night == "Yes")) %>% dplyr::group_by(grp = rep(1:2, length.out = n())) %>% dplyr::ungroup() %>% tidyr::pivot_wider(names_from = grp, values_from = PCS) %>% dplyr::rename("V1" = 3, "V2" = 4) %>% dplyr::left_join(combos, by = c("V1", "V2")) %>% unique() %>% dplyr::select(HHnum, PCS, work_night)
Lookup tables in R
I have a tibble with a ton of data in it, but most importantly, I have a column that references a row in a lookup table by number (ex. 1,2,3 etc). df <- tibble(ref = c(1,1,1,2,5) data = c(33,34,35,35,32)) lkup <- tibble(CurveID <- c(1,2,3,4,5) Slope <- c(-3.8,-3.5,-3.1,-3.3,-3.3) Intercept <- c(40,38,40,38,36) Min <- c(25,25,21,21,18) Max <- c(36,36,38,37,32)) I need to do a calculation for each row in the original tibble based on the information in the referenced row in the lookup table. df$result <- df$data - lkup$intercept[lkup$CurveID == df$ref]/lkup$slope[lkup$CurveID == df$ref] The idea is to access the slope or intercept (etc) value from the correct row of the lookup table based on the number in the data table, and to do this for each data point in the column. But I keep getting an error telling me my data isn't compatible, and that my objects need to be of the same length.
You could also do it with match() df$result <- df$data - lkup$Intercept[match(df$ref, lkup$CurveID)]/lkup$Slope[match(df$ref, lkup$CurveID)] df$result # [1] 43.52632 44.52632 45.52632 45.85714 42.90909
You could use the dplyr package to join the tibbles together. If the ref column and CurveID column have the same name then left_join will combine the two tibbles by the matching rows. library(dplyr) df <- tibble(CurveID = c(1,1,1,2,5), data = c(33,34,35,35,32)) lkup <- tibble(CurveID = c(1,2,3,4,5), Slope = c(-3.8,-3.5,-3.1,-3.3,-3.3), Intercept = c(40,38,40,38,36), Min = c(25,25,21,21,18), Max = c(36,36,38,37,32)) df <- df %>% left_join(lkup, by = "CurveID") Then do the calcuation on each row df <- df %>% mutate(result = data - (Intercept/Slope)) %>% select(CurveID, data, result)
For completeness' sake, here's one way to literally do what OP was trying: library(slider) df %>% mutate(result = slide_dbl(ref, ~ slice(lkup, .x)$Intercept / slice(lkup, .x)$Slope)) though since slice goes by row number, this relies on CurveID equalling the row number (we make no reference to CurveID at all). You can write it differently with filter but it ends up being more code.
How to sum up a list of variables in a customized dplyr function?
Starting point: I have a dataset (tibble) which contains a lot of Variables of the same class (dbl). They belong to different settings. A variable (column in the tibble) is missing. This is the rowSum of all variables belonging to one setting. Aim: My aim is to produce sub data sets with the same data structure for each setting including the "rowSum"-Variable (i call it "s1"). Problem: In each setting there are a different number of variables (and of course they are named differently). Because it should be the same structure with different variables it is a typical situation for a function. Question: How can I solve the problem using dplyr? I wrote a function to (1) subset the original dataset for the interessting setting (is working) and (2) try to rowSums the variables of the setting (does not work; Why?). Because it is a function for a special designed dataset, the function includes two predefined variables: day - which is any day of an investigation period N - which is the Number of cases investigated on this special day Thank you for any help. mkr.sumsetting <- function(...,dataset){ subvars <- rlang::enquos(...) #print(subvars) # Summarize the variables belonging to the interessting setting dfplot <- dataset %>% dplyr::select(day,N,!!! subvars) %>% dplyr::mutate(s1 = rowSums(!!! subvars,na.rm = TRUE)) return(dfplot) }
We can change it to string with as_name and subset the dataset with [[ for the rowSums library(rlang) library(purrr) library(dplyr) mkr.sumsetting <- function(...,dataset){ subvars <- rlang::enquos(...) v1 <- map_chr(subvars, as_name) #print(subvars) # Summarize the variables belonging to the interessting setting dfplot <- dataset %>% dplyr::select(day, N, !!! subvars) %>% dplyr::mutate(s1 = rowSums( .[v1],na.rm = TRUE)) return(dfplot) } out <- mkr.sumsetting(col1, col2, dataset = df1) head(out, 3) # day N col1 col2 s1 #1 1 20 -0.5458808 0.4703824 -0.07549832 #2 2 20 0.5365853 0.3756872 0.91227249 #3 3 20 0.4196231 0.2725374 0.69216051 Or another option would be select the quosure and then do the rowSums mkr.sumsetting <- function(...,dataset){ subvars <- rlang::enquos(...) #print(subvars) # Summarize the variables belonging to the interessting setting dfplot <- dataset %>% dplyr::select(day, N, !!! subvars) %>% dplyr::mutate(s1 = dplyr::select(., !!! subvars) %>% rowSums(na.rm = TRUE)) return(dfplot) } mkr.sumsetting(col1, col2, dataset = df1) data set.seed(24) df1 <- data.frame(day = 1:20, N = 20, col1 = rnorm(20), col2 = runif(20))
R rowsums if colnames match two arguments in a second attribute table
I want to calculate rowsums only if colnames (i.e. species) of my data frame match two arguments in a second attribute table. This means it shoul first match the name in a column of the attributes table AND have a certain entry in another column of the attribute table. However, the attribute table contains more species than the orginal data frame. I tried : # Species data from vegan package: data(varespec, package = "vegan") # create attributes table attributes <- matrix(NA, length(varespec), 2) attributes[,1] <- colnames(varespec) attributes[,2] <- c(rep("MI",14),rep("PI",30)) # add species to the attribute table x <- c("spec1","MI") y <- c("spec2","PI") attributes <- rbind(attributes, x, y) row.names(attributes) <- c(1:46) # calculate rowsums only for species contained in the attributes table # and having the entry "MI" in the attributes table for (i in 1:44){ for (j in 1:46){ if ((colnames(varespec)[i] == attributes[j,1]) & (attributes[j,2] == "MI")) { apply(varespec,1,sum) } }} But it always summed up the whole rows and not only the MI - species.
This is easy to solve if you convert the dataset into a long format library(dplyr) library(tidyr) data(varespec, package = "vegan") attributes <- data.frame( Species = c(colnames(varespec), "spec1", "spec2"), Attribute = c(rep(c("MI", "PI"), c(14, 30)), "MI", "PI") ) varespec %>% add_rownames("ID") %>% gather(Species, Value, -ID) %>% #convert to long format inner_join(attributes, by = "Species") %>% filter(Attribute == "MI") %>% group_by(ID) %>% summarise(Total = sum(Value))