witness-0.6.2: values that witness types
Safe HaskellSafe-Inferred
LanguageHaskell2010

Data.Type.Witness.Specific.All

Documentation

newtype AllFor f w Source #

Constructors

MkAllFor 

Fields

newtype AllOf w Source #

Constructors

MkAllOf 

Fields

Instances

Instances details
(FiniteWitness w, AllConstraint Show w, WitnessConstraint Show w) => Show (AllOf w) Source # 
Instance details

Defined in Data.Type.Witness.General.Finite

Methods

showsPrec :: Int -> AllOf w -> ShowS #

show :: AllOf w -> String #

showList :: [AllOf w] -> ShowS #

setAllOf :: forall (w :: Type -> Type) (a :: Type). TestEquality w => w a -> a -> AllOf w -> AllOf w Source #

allForToAllOf :: forall (w :: Type -> Type). AllFor Identity w -> AllOf w Source #

allOfToAllFor :: forall (w :: Type -> Type). AllOf w -> AllFor Identity w Source #

allMapSome :: AllFor f w -> SomeFor g w -> SomeFor g f Source #

type family UnAllOf aw where ... Source #

Equations

UnAllOf (AllOf w) = w 

splitSomeOfList :: forall (w :: Type -> Type). TestEquality w => [SomeOf w] -> AllFor [] w Source #

allForWitnessConstraint :: forall k (c :: k -> Constraint) (w :: k -> Type). WitnessConstraint c w => AllFor (Compose Dict c) w Source #