| computeFdr {TPP2D} | R Documentation |
Compute FDR for given F statistics based on true and null dataset
computeFdr(df_out, df_null)
df_out |
data frame containing results from analysis by fitAndEvalDataset |
df_null |
data frame containing results from analysis by bootstrapNull |
data frame annotating each protein with a FDR based on it's F statistic and number of observations
data("simulated_cell_extract_df")
temp_df <- simulated_cell_extract_df %>%
filter(clustername %in% paste0("protein", 1:5)) %>%
group_by(representative) %>%
mutate(nObs = n()) %>%
ungroup
example_out <- fitAndEvalDataset(temp_df)
example_null <- bootstrapNull(temp_df, B = 2/10)
computeFdr(example_out, example_null)