Safe Haskell | Safe-Inferred |
---|---|
Language | Haskell2010 |
Documentation
type IndexPartition a = Map a IndexSet Source #
data Permutation n Source #
Instances
KnownNat n => Arbitrary (Permutation n) Source # | |
Defined in ZkFold.Base.Algebra.Basic.Permutations arbitrary :: Gen (Permutation n) # shrink :: Permutation n -> [Permutation n] # | |
Show (Permutation n) Source # | |
Defined in ZkFold.Base.Algebra.Basic.Permutations showsPrec :: Int -> Permutation n -> ShowS # show :: Permutation n -> String # showList :: [Permutation n] -> ShowS # | |
Eq (Permutation n) Source # | |
Defined in ZkFold.Base.Algebra.Basic.Permutations (==) :: Permutation n -> Permutation n -> Bool # (/=) :: Permutation n -> Permutation n -> Bool # |
fromPermutation :: Permutation n -> [Natural] Source #
applyPermutation :: KnownNat n => Permutation n -> Vector n a -> Vector n a Source #
mkIndexPartition :: Ord a => Vector a -> IndexPartition a Source #
fromCycles :: KnownNat n => IndexPartition a -> Permutation n Source #