R/collapse_do_alleles.R

Defines functions collapse_do_alleles

Documented in collapse_do_alleles

# collapse_do_alleles
#' Collapse alleles for simulated DO genotypes
#'
#' When simulating Diversity Outbreds, we need to specify parents
#' 1-16, with 9-16 being the males from strains 1-8.  This function
#' collapses replaces alleles 9-16 with 1-8, to make the result
#' ordinary DO-type data.
#'
#' @param xodata The sort of detailed genotype/crossover data
#' generated by [sim_from_pedigree()].
#'
#' @return The input object, with alleles 9-16 replaced by 1-8.
#'
#' @export
#' @keywords utilities
#' @seealso [sim_do_pedigree()], [sim_do_pedigree_fix_n()],
#' [sim_from_pedigree()]
#'
#' @examples
#' # simulate DO pedigree
#' tab <- sim_do_pedigree(8)
#'
#' # simulate genotypes for that pedigree
#' dat <- sim_from_pedigree(tab)
#' # collapse to alleles 1-8
#' dat <- collapse_do_alleles(dat)
#'
#' # also works with data on multiple chromosomes
#' \donttest{dat <- sim_from_pedigree(tab, c("1"=100, "2"=75, "X"=100), xchr="X")
#' dat <- collapse_do_alleles(dat)}

collapse_do_alleles <-
    function(xodata)
{
    if(!("mat" %in% names(xodata[[1]]))) { # multiple chromosomes?
        if(!("mat" %in% names(xodata[[1]][[1]])))
            stop("input doesn't look like the output of sim_from_pedigree")
        return(lapply(xodata, collapse_do_alleles))
    }

    lapply(xodata, function(a) {
        # grab alleles
        mata <- a$mat$alleles
        pata <- a$pat$alleles
        matl <- a$mat$locations
        patl <- a$pat$locations

        # 9-16 -> 1-8
        mata[mata > 8] <- mata[mata > 8] - 8
        pata[pata > 8] <- pata[pata > 8] - 8

        if(any(diff(mata)==0)) { # adjacent alleles the same
            drop <- which(diff(mata)==0)
            mata <- mata[-(drop+1)]
            matl <- matl[-drop]
        }
        if(any(diff(pata)==0)) { # ajacent alleles the same
            drop <- which(diff(pata)==0)
            pata <- pata[-(drop+1)]
            patl <- patl[-drop]
        }

        # paste back into object
        a$mat$alleles <- mata
        a$pat$alleles <- pata
        a$mat$locations <- matl
        a$pat$locations <- patl

        a })

}
kbroman/simcross documentation built on Jan. 13, 2024, 10:31 p.m.