Hi Thanks for the response,
Not sure what else I can provide, here is the sample snippet of the line I am trying to execute
var1 <- var %>% group_by(abc, Year) %>% summarise(S=sum(S, na.rm = T), L=sum(L, na.rm = T),C=sum(C, na.rm = T),L_C=sum(L_C, na.rm = T),L_D=sum(L_D, na.rm = T)) %>% data.frame() %>%
+ mutate(Rank1=FUN.Rank_New(L, Type=RankType),
+ Rank1Percentile=FUN.Rank_0_100_New(Loss, Type=RankType),
+ GScore=FUN_Score_1_3(GRnkPercentile)) %>% arrange(GRank) %>% data.frame()
`summarise()` has grouped output by 'T'. You can override using the `.groups` argument.
Error: Problem with `mutate()` column `GScore`.
i `GScore = FUN_Score_1_3(GRnkPercentile)`.
x invalid 'labels'; length 3 should be 1 or 0
Run `rlang::last_error()` to see where the error occurred.
In addition: Warning message:
Problem with `mutate()` column `GRnkPercentile`.
i `GRnkPercentile = FUN.Rank_0_100_New(L, Type = RankType)`.
i no non-missing arguments to max; returning -Inf
Called from: signal_abort(cnd)