Safe Haskell | Safe-Inferred |
---|---|
Language | Haskell2010 |
Language.Fortran.Repr.Compat.Natural
Description
Compatibility definitions for working with term and type level natural numbers across multiple GHC versions.
Prior to GHC 9.2:
- Term level natural numbers:
Natural :: Type
- Type level natural numbers:
n :: Nat
As of GHC 9.2:
- Term level natural numbers:
Natural :: Type
- Type level natural numbers:
n :: Natural
To avoid issues, we export a NaturalK
kind that will refer to the correct
definition for your platform.
Documentation
Natural number
Invariant: numbers <= 0xffffffffffffffff use the NS
constructor
Instances
Out Natural Source # | |||||||||||||||||||||||||
Data Natural | Since: base-4.8.0.0 | ||||||||||||||||||||||||
Defined in Data.Data Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Natural -> c Natural # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Natural # toConstr :: Natural -> Constr # dataTypeOf :: Natural -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Natural) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Natural) # gmapT :: (forall b. Data b => b -> b) -> Natural -> Natural # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Natural -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Natural -> r # gmapQ :: (forall d. Data d => d -> u) -> Natural -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Natural -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Natural -> m Natural # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Natural -> m Natural # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Natural -> m Natural # | |||||||||||||||||||||||||
Bits Natural | Since: base-4.8.0 | ||||||||||||||||||||||||
Defined in GHC.Bits Methods (.&.) :: Natural -> Natural -> Natural # (.|.) :: Natural -> Natural -> Natural # xor :: Natural -> Natural -> Natural # complement :: Natural -> Natural # shift :: Natural -> Int -> Natural # rotate :: Natural -> Int -> Natural # setBit :: Natural -> Int -> Natural # clearBit :: Natural -> Int -> Natural # complementBit :: Natural -> Int -> Natural # testBit :: Natural -> Int -> Bool # bitSizeMaybe :: Natural -> Maybe Int # shiftL :: Natural -> Int -> Natural # unsafeShiftL :: Natural -> Int -> Natural # shiftR :: Natural -> Int -> Natural # unsafeShiftR :: Natural -> Int -> Natural # rotateL :: Natural -> Int -> Natural # | |||||||||||||||||||||||||
Enum Natural | Since: base-4.8.0.0 | ||||||||||||||||||||||||
Ix Natural | Since: base-4.8.0.0 | ||||||||||||||||||||||||
Defined in GHC.Ix | |||||||||||||||||||||||||
Num Natural | Note that Since: base-4.8.0.0 | ||||||||||||||||||||||||
Read Natural | Since: base-4.8.0.0 | ||||||||||||||||||||||||
Integral Natural | Since: base-4.8.0.0 | ||||||||||||||||||||||||
Defined in GHC.Real | |||||||||||||||||||||||||
Real Natural | Since: base-4.8.0.0 | ||||||||||||||||||||||||
Defined in GHC.Real Methods toRational :: Natural -> Rational # | |||||||||||||||||||||||||
Show Natural | Since: base-4.8.0.0 | ||||||||||||||||||||||||
PrintfArg Natural | Since: base-4.8.0.0 | ||||||||||||||||||||||||
Defined in Text.Printf | |||||||||||||||||||||||||
Binary Natural | Since: binary-0.7.3.0 | ||||||||||||||||||||||||
NFData Natural | Since: deepseq-1.4.0.0 | ||||||||||||||||||||||||
Defined in Control.DeepSeq | |||||||||||||||||||||||||
Eq Natural | |||||||||||||||||||||||||
Ord Natural | |||||||||||||||||||||||||
Hashable Natural | |||||||||||||||||||||||||
Defined in Data.Hashable.Class | |||||||||||||||||||||||||
UniformRange Natural | |||||||||||||||||||||||||
PEnum Natural | |||||||||||||||||||||||||
Defined in Data.Singletons.Base.Enum Associated Types
| |||||||||||||||||||||||||
SEnum Natural | |||||||||||||||||||||||||
Defined in Data.Singletons.Base.Enum Methods sSucc :: forall (t :: Natural). Sing t -> Sing (Apply (SuccSym0 :: TyFun Natural Natural -> Type) t) # sPred :: forall (t :: Natural). Sing t -> Sing (Apply (PredSym0 :: TyFun Natural Natural -> Type) t) # sToEnum :: forall (t :: Natural). Sing t -> Sing (Apply (ToEnumSym0 :: TyFun Natural Natural -> Type) t) # sFromEnum :: forall (t :: Natural). Sing t -> Sing (Apply (FromEnumSym0 :: TyFun Natural Natural -> Type) t) # sEnumFromTo :: forall (t1 :: Natural) (t2 :: Natural). Sing t1 -> Sing t2 -> Sing (Apply (Apply (EnumFromToSym0 :: TyFun Natural (Natural ~> [Natural]) -> Type) t1) t2) # sEnumFromThenTo :: forall (t1 :: Natural) (t2 :: Natural) (t3 :: Natural). Sing t1 -> Sing t2 -> Sing t3 -> Sing (Apply (Apply (Apply (EnumFromThenToSym0 :: TyFun Natural (Natural ~> (Natural ~> [Natural])) -> Type) t1) t2) t3) # | |||||||||||||||||||||||||
PShow Natural | |||||||||||||||||||||||||
Defined in Text.Show.Singletons | |||||||||||||||||||||||||
SShow Natural | |||||||||||||||||||||||||
Defined in Text.Show.Singletons Methods sShowsPrec :: forall (t1 :: Natural) (t2 :: Natural) (t3 :: Symbol). Sing t1 -> Sing t2 -> Sing t3 -> Sing (Apply (Apply (Apply (ShowsPrecSym0 :: TyFun Natural (Natural ~> (Symbol ~> Symbol)) -> Type) t1) t2) t3) # sShow_ :: forall (t :: Natural). Sing t -> Sing (Apply (Show_Sym0 :: TyFun Natural Symbol -> Type) t) # sShowList :: forall (t1 :: [Natural]) (t2 :: Symbol). Sing t1 -> Sing t2 -> Sing (Apply (Apply (ShowListSym0 :: TyFun [Natural] (Symbol ~> Symbol) -> Type) t1) t2) # | |||||||||||||||||||||||||
KnownNat n => HasResolution (n :: Nat) | For example, | ||||||||||||||||||||||||
Defined in Data.Fixed Methods resolution :: p n -> Integer # | |||||||||||||||||||||||||
TestCoercion SNat | Since: base-4.18.0.0 | ||||||||||||||||||||||||
Defined in GHC.TypeNats | |||||||||||||||||||||||||
TestEquality SNat | Since: base-4.18.0.0 | ||||||||||||||||||||||||
Defined in GHC.TypeNats | |||||||||||||||||||||||||
Lift Natural | |||||||||||||||||||||||||
SingI2 EfdtNatDnSym2 | |||||||||||||||||||||||||
SingI2 EfdtNatSym2 | |||||||||||||||||||||||||
SingI2 EfdtNatUpSym2 | |||||||||||||||||||||||||
SShow a => SingI2 (ShowsPrecSym2 :: Natural -> a -> TyFun Symbol Symbol -> Type) | |||||||||||||||||||||||||
Defined in Text.Show.Singletons | |||||||||||||||||||||||||
SingI1 EfdtNatDnSym1 | |||||||||||||||||||||||||
SingI1 EfdtNatSym1 | |||||||||||||||||||||||||
SingI1 EfdtNatUpSym1 | |||||||||||||||||||||||||
SingI1 EftNatSym1 | |||||||||||||||||||||||||
SingI1 DivSym1 | |||||||||||||||||||||||||
SingI1 ModSym1 | |||||||||||||||||||||||||
SingI1 (^@#@$$) | |||||||||||||||||||||||||
SingI1 (SplitAtSym1 :: Natural -> TyFun (NonEmpty a) ([a], [a]) -> Type) | |||||||||||||||||||||||||
Defined in Data.List.NonEmpty.Singletons | |||||||||||||||||||||||||
SingI1 (DropSym1 :: Natural -> TyFun (NonEmpty a) [a] -> Type) | |||||||||||||||||||||||||
SingI1 (TakeSym1 :: Natural -> TyFun (NonEmpty a) [a] -> Type) | |||||||||||||||||||||||||
SingI d => SingI1 (EfdtNatDnSym2 d :: Natural -> TyFun Natural [Natural] -> Type) | |||||||||||||||||||||||||
SingI d => SingI1 (EfdtNatSym2 d :: Natural -> TyFun Natural [Natural] -> Type) | |||||||||||||||||||||||||
SingI d => SingI1 (EfdtNatUpSym2 d :: Natural -> TyFun Natural [Natural] -> Type) | |||||||||||||||||||||||||
SShow a => SingI1 (ShowsPrecSym1 :: Natural -> TyFun a (Symbol ~> Symbol) -> Type) | |||||||||||||||||||||||||
SingI1 ((<=?@#@$$) :: Natural -> TyFun Natural Bool -> Type) | |||||||||||||||||||||||||
Defined in GHC.TypeLits.Singletons.Internal | |||||||||||||||||||||||||
SApplicative m => SingI1 (ReplicateM_Sym1 :: Natural -> TyFun (m a) (m ()) -> Type) | |||||||||||||||||||||||||
Defined in Control.Monad.Singletons | |||||||||||||||||||||||||
SApplicative m => SingI1 (ReplicateMSym1 :: Natural -> TyFun (m a) (m [a]) -> Type) | |||||||||||||||||||||||||
Defined in Control.Monad.Singletons | |||||||||||||||||||||||||
SingI1 ((!!@#@$$) :: NonEmpty a -> TyFun Natural a -> Type) | |||||||||||||||||||||||||
SingI EfdtNatDnSym0 | |||||||||||||||||||||||||
Defined in Data.Singletons.Base.Enum | |||||||||||||||||||||||||
SingI EfdtNatSym0 | |||||||||||||||||||||||||
Defined in Data.Singletons.Base.Enum | |||||||||||||||||||||||||
SingI EfdtNatUpSym0 | |||||||||||||||||||||||||
Defined in Data.Singletons.Base.Enum | |||||||||||||||||||||||||
SingI EftNatSym0 | |||||||||||||||||||||||||
Defined in Data.Singletons.Base.Enum | |||||||||||||||||||||||||
SingI DivSym0 | |||||||||||||||||||||||||
Defined in GHC.TypeLits.Singletons | |||||||||||||||||||||||||
SingI ModSym0 | |||||||||||||||||||||||||
Defined in GHC.TypeLits.Singletons | |||||||||||||||||||||||||
SingI (^@#@$) | |||||||||||||||||||||||||
Defined in GHC.TypeLits.Singletons.Internal | |||||||||||||||||||||||||
SingI Log2Sym0 | |||||||||||||||||||||||||
Defined in GHC.TypeLits.Singletons | |||||||||||||||||||||||||
SingI NatToCharSym0 | |||||||||||||||||||||||||
Defined in GHC.TypeLits.Singletons Methods sing :: Sing NatToCharSym0 # | |||||||||||||||||||||||||
SingI CharToNatSym0 | |||||||||||||||||||||||||
Defined in GHC.TypeLits.Singletons Methods sing :: Sing CharToNatSym0 # | |||||||||||||||||||||||||
SuppressUnusedWarnings KnownNatSym0 | |||||||||||||||||||||||||
Defined in GHC.TypeLits.Singletons Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings FromEnum_6989586621679638224Sym0 | |||||||||||||||||||||||||
Defined in Data.Singletons.Base.Enum Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings ToEnum_6989586621679638208Sym0 | |||||||||||||||||||||||||
Defined in Data.Singletons.Base.Enum Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings ShowsPrec_6989586621680870199Sym0 | |||||||||||||||||||||||||
Defined in Data.Semigroup.Singletons Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings ShowsPrec_6989586621680870220Sym0 | |||||||||||||||||||||||||
Defined in Data.Semigroup.Singletons Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings ShowsPrec_6989586621680242786Sym0 | |||||||||||||||||||||||||
Defined in Text.Show.Singletons Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings ShowsPrec_6989586621680242761Sym0 | |||||||||||||||||||||||||
Defined in Text.Show.Singletons Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings EfdtNatDnSym0 | |||||||||||||||||||||||||
Defined in Data.Singletons.Base.Enum Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings EfdtNatSym0 | |||||||||||||||||||||||||
Defined in Data.Singletons.Base.Enum Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings EfdtNatUpSym0 | |||||||||||||||||||||||||
Defined in Data.Singletons.Base.Enum Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings EnumFromThenTo_6989586621679610519Sym0 | |||||||||||||||||||||||||
Defined in Data.Singletons.Base.Enum Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings DivSym0 | |||||||||||||||||||||||||
Defined in GHC.TypeLits.Singletons Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings ModSym0 | |||||||||||||||||||||||||
Defined in GHC.TypeLits.Singletons Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings QuotSym0 | |||||||||||||||||||||||||
Defined in GHC.TypeLits.Singletons Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings RemSym0 | |||||||||||||||||||||||||
Defined in GHC.TypeLits.Singletons Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings (^@#@$) | |||||||||||||||||||||||||
Defined in GHC.TypeLits.Singletons.Internal Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings DivModSym0 | |||||||||||||||||||||||||
Defined in GHC.TypeLits.Singletons Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings QuotRemSym0 | |||||||||||||||||||||||||
Defined in GHC.TypeLits.Singletons Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings EftNatSym0 | |||||||||||||||||||||||||
Defined in Data.Singletons.Base.Enum Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings EnumFromTo_6989586621679610503Sym0 | |||||||||||||||||||||||||
Defined in Data.Singletons.Base.Enum Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings ShowsPrec_6989586621680242615Sym0 | |||||||||||||||||||||||||
Defined in Text.Show.Singletons Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings ShowsPrec_6989586621680242741Sym0 | |||||||||||||||||||||||||
Defined in Text.Show.Singletons Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings ShowsCharPrecSym0 | |||||||||||||||||||||||||
Defined in Text.Show.Singletons Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings ShowsNatSym0 | |||||||||||||||||||||||||
Defined in Text.Show.Singletons Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings FromEnum_6989586621679610495Sym0 | |||||||||||||||||||||||||
Defined in Data.Singletons.Base.Enum Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings Pred_6989586621679610481Sym0 | |||||||||||||||||||||||||
Defined in Data.Singletons.Base.Enum Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings Succ_6989586621679610474Sym0 | |||||||||||||||||||||||||
Defined in Data.Singletons.Base.Enum Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings ToEnum_6989586621679610488Sym0 | |||||||||||||||||||||||||
Defined in Data.Singletons.Base.Enum Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings Log2Sym0 | |||||||||||||||||||||||||
Defined in GHC.TypeLits.Singletons Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings ToEnum_6989586621679638231Sym0 | |||||||||||||||||||||||||
Defined in Data.Singletons.Base.Enum Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings ToEnum_6989586621679638188Sym0 | |||||||||||||||||||||||||
Defined in Data.Singletons.Base.Enum Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings ToEnum_6989586621679610538Sym0 | |||||||||||||||||||||||||
Defined in Data.Singletons.Base.Enum Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings NatToCharSym0 | |||||||||||||||||||||||||
Defined in GHC.TypeLits.Singletons Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings FromEnum_6989586621679638241Sym0 | |||||||||||||||||||||||||
Defined in Data.Singletons.Base.Enum Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings FromEnum_6989586621679638201Sym0 | |||||||||||||||||||||||||
Defined in Data.Singletons.Base.Enum Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings FromEnum_6989586621679610547Sym0 | |||||||||||||||||||||||||
Defined in Data.Singletons.Base.Enum Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings CharToNatSym0 | |||||||||||||||||||||||||
Defined in GHC.TypeLits.Singletons Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SingI ((!!@#@$) :: TyFun (NonEmpty a) (Natural ~> a) -> Type) | |||||||||||||||||||||||||
SingI (LengthSym0 :: TyFun (NonEmpty a) Natural -> Type) | |||||||||||||||||||||||||
Defined in Data.List.NonEmpty.Singletons | |||||||||||||||||||||||||
SingI (SplitAtSym0 :: TyFun Natural (NonEmpty a ~> ([a], [a])) -> Type) | |||||||||||||||||||||||||
Defined in Data.List.NonEmpty.Singletons | |||||||||||||||||||||||||
SingI (DropSym0 :: TyFun Natural (NonEmpty a ~> [a]) -> Type) | |||||||||||||||||||||||||
SingI (TakeSym0 :: TyFun Natural (NonEmpty a ~> [a]) -> Type) | |||||||||||||||||||||||||
SingI d => SingI (EfdtNatDnSym1 d :: TyFun Natural (Natural ~> [Natural]) -> Type) | |||||||||||||||||||||||||
Defined in Data.Singletons.Base.Enum | |||||||||||||||||||||||||
SingI d => SingI (EfdtNatSym1 d :: TyFun Natural (Natural ~> [Natural]) -> Type) | |||||||||||||||||||||||||
Defined in Data.Singletons.Base.Enum | |||||||||||||||||||||||||
SingI d => SingI (EfdtNatUpSym1 d :: TyFun Natural (Natural ~> [Natural]) -> Type) | |||||||||||||||||||||||||
Defined in Data.Singletons.Base.Enum | |||||||||||||||||||||||||
SShow a => SingI (ShowsPrecSym0 :: TyFun Natural (a ~> (Symbol ~> Symbol)) -> Type) | |||||||||||||||||||||||||
SingI d => SingI (EftNatSym1 d :: TyFun Natural [Natural] -> Type) | |||||||||||||||||||||||||
Defined in Data.Singletons.Base.Enum | |||||||||||||||||||||||||
SEnum a => SingI (ToEnumSym0 :: TyFun Natural a -> Type) | |||||||||||||||||||||||||
Defined in Data.Singletons.Base.Enum | |||||||||||||||||||||||||
SEnum a => SingI (FromEnumSym0 :: TyFun a Natural -> Type) | |||||||||||||||||||||||||
Defined in Data.Singletons.Base.Enum | |||||||||||||||||||||||||
SingI ((<=?@#@$) :: TyFun Natural (Natural ~> Bool) -> Type) | |||||||||||||||||||||||||
SingI x => SingI (DivSym1 x :: TyFun Natural Natural -> Type) | |||||||||||||||||||||||||
Defined in GHC.TypeLits.Singletons | |||||||||||||||||||||||||
SingI x => SingI (ModSym1 x :: TyFun Natural Natural -> Type) | |||||||||||||||||||||||||
Defined in GHC.TypeLits.Singletons | |||||||||||||||||||||||||
SingI x => SingI ((^@#@$$) x :: TyFun Natural Natural -> Type) | |||||||||||||||||||||||||
Defined in GHC.TypeLits.Singletons.Internal | |||||||||||||||||||||||||
SuppressUnusedWarnings (FromEnum_6989586621680647218Sym0 :: TyFun (Identity a) Natural -> Type) | |||||||||||||||||||||||||
Defined in Data.Functor.Identity.Singletons Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings (Length_6989586621680648801Sym0 :: TyFun (Identity a) Natural -> Type) | |||||||||||||||||||||||||
Defined in Data.Functor.Identity.Singletons Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings (FromEnum_6989586621680889815Sym0 :: TyFun (First a) Natural -> Type) | |||||||||||||||||||||||||
Defined in Data.Semigroup.Singletons Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings (FromEnum_6989586621680890023Sym0 :: TyFun (Last a) Natural -> Type) | |||||||||||||||||||||||||
Defined in Data.Semigroup.Singletons Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings (FromEnum_6989586621680889296Sym0 :: TyFun (Max a) Natural -> Type) | |||||||||||||||||||||||||
Defined in Data.Semigroup.Singletons Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings (FromEnum_6989586621680888348Sym0 :: TyFun (Min a) Natural -> Type) | |||||||||||||||||||||||||
Defined in Data.Semigroup.Singletons Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings (FromEnum_6989586621680890192Sym0 :: TyFun (WrappedMonoid a) Natural -> Type) | |||||||||||||||||||||||||
Defined in Data.Semigroup.Singletons Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings (Length_6989586621680395427Sym0 :: TyFun (Dual a) Natural -> Type) | |||||||||||||||||||||||||
Defined in Data.Foldable.Singletons Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings (Length_6989586621680395777Sym0 :: TyFun (Product a) Natural -> Type) | |||||||||||||||||||||||||
Defined in Data.Foldable.Singletons Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings (Length_6989586621680395602Sym0 :: TyFun (Sum a) Natural -> Type) | |||||||||||||||||||||||||
Defined in Data.Foldable.Singletons Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings ((!!@#@$) :: TyFun (NonEmpty a) (Natural ~> a) -> Type) | |||||||||||||||||||||||||
Defined in Data.List.NonEmpty.Singletons Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings (LengthSym0 :: TyFun (NonEmpty a) Natural -> Type) | |||||||||||||||||||||||||
Defined in Data.List.NonEmpty.Singletons Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings (FromInteger_6989586621680647427Sym0 :: TyFun Natural (Identity a) -> Type) | |||||||||||||||||||||||||
Defined in Data.Functor.Identity.Singletons Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings (ToEnum_6989586621680647211Sym0 :: TyFun Natural (Identity a) -> Type) | |||||||||||||||||||||||||
Defined in Data.Functor.Identity.Singletons Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings (ToEnum_6989586621680889806Sym0 :: TyFun Natural (First a) -> Type) | |||||||||||||||||||||||||
Defined in Data.Semigroup.Singletons Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings (ToEnum_6989586621680890014Sym0 :: TyFun Natural (Last a) -> Type) | |||||||||||||||||||||||||
Defined in Data.Semigroup.Singletons Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings (FromInteger_6989586621680889449Sym0 :: TyFun Natural (Max a) -> Type) | |||||||||||||||||||||||||
Defined in Data.Semigroup.Singletons Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings (ToEnum_6989586621680889287Sym0 :: TyFun Natural (Max a) -> Type) | |||||||||||||||||||||||||
Defined in Data.Semigroup.Singletons Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings (FromInteger_6989586621680888684Sym0 :: TyFun Natural (Min a) -> Type) | |||||||||||||||||||||||||
Defined in Data.Semigroup.Singletons Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings (ToEnum_6989586621680888339Sym0 :: TyFun Natural (Min a) -> Type) | |||||||||||||||||||||||||
Defined in Data.Semigroup.Singletons Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings (ToEnum_6989586621680890183Sym0 :: TyFun Natural (WrappedMonoid a) -> Type) | |||||||||||||||||||||||||
Defined in Data.Semigroup.Singletons Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings (ShowsPrec_6989586621680647477Sym0 :: TyFun Natural (Identity a ~> (Symbol ~> Symbol)) -> Type) | |||||||||||||||||||||||||
Defined in Data.Functor.Identity.Singletons Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings (ShowsPrec_6989586621680305877Sym0 :: TyFun Natural (First a ~> (Symbol ~> Symbol)) -> Type) | |||||||||||||||||||||||||
Defined in Data.Monoid.Singletons Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings (ShowsPrec_6989586621680305922Sym0 :: TyFun Natural (Last a ~> (Symbol ~> Symbol)) -> Type) | |||||||||||||||||||||||||
Defined in Data.Monoid.Singletons Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings (ShowsPrec_6989586621680870340Sym0 :: TyFun Natural (First a ~> (Symbol ~> Symbol)) -> Type) | |||||||||||||||||||||||||
Defined in Data.Semigroup.Singletons Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings (ShowsPrec_6989586621680870364Sym0 :: TyFun Natural (Last a ~> (Symbol ~> Symbol)) -> Type) | |||||||||||||||||||||||||
Defined in Data.Semigroup.Singletons Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings (ShowsPrec_6989586621680870316Sym0 :: TyFun Natural (Max a ~> (Symbol ~> Symbol)) -> Type) | |||||||||||||||||||||||||
Defined in Data.Semigroup.Singletons Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings (ShowsPrec_6989586621680870292Sym0 :: TyFun Natural (Min a ~> (Symbol ~> Symbol)) -> Type) | |||||||||||||||||||||||||
Defined in Data.Semigroup.Singletons Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings (ShowsPrec_6989586621680870388Sym0 :: TyFun Natural (WrappedMonoid m ~> (Symbol ~> Symbol)) -> Type) | |||||||||||||||||||||||||
Defined in Data.Semigroup.Singletons Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings (ShowsPrec_6989586621680870178Sym0 :: TyFun Natural (Dual a ~> (Symbol ~> Symbol)) -> Type) | |||||||||||||||||||||||||
Defined in Data.Semigroup.Singletons Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings (ShowsPrec_6989586621680870268Sym0 :: TyFun Natural (Product a ~> (Symbol ~> Symbol)) -> Type) | |||||||||||||||||||||||||
Defined in Data.Semigroup.Singletons Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings (ShowsPrec_6989586621680870244Sym0 :: TyFun Natural (Sum a ~> (Symbol ~> Symbol)) -> Type) | |||||||||||||||||||||||||
Defined in Data.Semigroup.Singletons Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings (ShowsPrec_6989586621680242721Sym0 :: TyFun Natural (NonEmpty a ~> (Symbol ~> Symbol)) -> Type) | |||||||||||||||||||||||||
Defined in Text.Show.Singletons Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings (SplitAtSym0 :: TyFun Natural (NonEmpty a ~> ([a], [a])) -> Type) | |||||||||||||||||||||||||
Defined in Data.List.NonEmpty.Singletons Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings (DropSym0 :: TyFun Natural (NonEmpty a ~> [a]) -> Type) | |||||||||||||||||||||||||
Defined in Data.List.NonEmpty.Singletons Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings (TakeSym0 :: TyFun Natural (NonEmpty a ~> [a]) -> Type) | |||||||||||||||||||||||||
Defined in Data.List.NonEmpty.Singletons Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings (ShowsPrec_6989586621680242644Sym0 :: TyFun Natural (Maybe a ~> (Symbol ~> Symbol)) -> Type) | |||||||||||||||||||||||||
Defined in Text.Show.Singletons Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings (EfdtNatDnSym1 a6989586621679610288 :: TyFun Natural (Natural ~> [Natural]) -> Type) | |||||||||||||||||||||||||
Defined in Data.Singletons.Base.Enum Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings (EfdtNatSym1 a6989586621679610362 :: TyFun Natural (Natural ~> [Natural]) -> Type) | |||||||||||||||||||||||||
Defined in Data.Singletons.Base.Enum Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings (EfdtNatUpSym1 a6989586621679610325 :: TyFun Natural (Natural ~> [Natural]) -> Type) | |||||||||||||||||||||||||
Defined in Data.Singletons.Base.Enum Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings (EnumFromThenTo_6989586621679610519Sym1 a6989586621679610531 :: TyFun Natural (Natural ~> [Natural]) -> Type) | |||||||||||||||||||||||||
Defined in Data.Singletons.Base.Enum Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings (ShowsPrec_6989586621680212350Sym0 :: TyFun Natural ([a] ~> (Symbol ~> Symbol)) -> Type) | |||||||||||||||||||||||||
Defined in Text.Show.Singletons Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings (ShowsPrecSym0 :: TyFun Natural (a ~> (Symbol ~> Symbol)) -> Type) | |||||||||||||||||||||||||
Defined in Text.Show.Singletons Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings (ShowsPrec_6989586621680212318Sym0 :: TyFun Natural (a ~> (Symbol ~> Symbol)) -> Type) | |||||||||||||||||||||||||
Defined in Text.Show.Singletons Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings (DivSym1 a6989586621679564295 :: TyFun Natural Natural -> Type) | |||||||||||||||||||||||||
Defined in GHC.TypeLits.Singletons Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings (ModSym1 a6989586621679564731 :: TyFun Natural Natural -> Type) | |||||||||||||||||||||||||
Defined in GHC.TypeLits.Singletons Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings (QuotSym1 a6989586621679565336 :: TyFun Natural Natural -> Type) | |||||||||||||||||||||||||
Defined in GHC.TypeLits.Singletons Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings (RemSym1 a6989586621679565325 :: TyFun Natural Natural -> Type) | |||||||||||||||||||||||||
Defined in GHC.TypeLits.Singletons Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings ((^@#@$$) a6989586621679553326 :: TyFun Natural Natural -> Type) | |||||||||||||||||||||||||
Defined in GHC.TypeLits.Singletons.Internal Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings (DivModSym1 a6989586621679565354 :: TyFun Natural (Natural, Natural) -> Type) | |||||||||||||||||||||||||
Defined in GHC.TypeLits.Singletons Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings (QuotRemSym1 a6989586621679565347 :: TyFun Natural (Natural, Natural) -> Type) | |||||||||||||||||||||||||
Defined in GHC.TypeLits.Singletons Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings (EftNatSym1 a6989586621679610380 :: TyFun Natural [Natural] -> Type) | |||||||||||||||||||||||||
Defined in Data.Singletons.Base.Enum Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings (EnumFromTo_6989586621679610503Sym1 a6989586621679610512 :: TyFun Natural [Natural] -> Type) | |||||||||||||||||||||||||
Defined in Data.Singletons.Base.Enum Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings (ToEnumSym0 :: TyFun Natural a -> Type) | |||||||||||||||||||||||||
Defined in Data.Singletons.Base.Enum Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings (Length_6989586621680395018Sym0 :: TyFun [a] Natural -> Type) | |||||||||||||||||||||||||
Defined in Data.Foldable.Singletons Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings (FromEnumSym0 :: TyFun a Natural -> Type) | |||||||||||||||||||||||||
Defined in Data.Singletons.Base.Enum Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SApplicative m => SingI (ReplicateM_Sym0 :: TyFun Natural (m a ~> m ()) -> Type) | |||||||||||||||||||||||||
Defined in Control.Monad.Singletons | |||||||||||||||||||||||||
SApplicative m => SingI (ReplicateMSym0 :: TyFun Natural (m a ~> m [a]) -> Type) | |||||||||||||||||||||||||
Defined in Control.Monad.Singletons | |||||||||||||||||||||||||
(SingI d1, SingI d2) => SingI (EfdtNatDnSym2 d1 d2 :: TyFun Natural [Natural] -> Type) | |||||||||||||||||||||||||
Defined in Data.Singletons.Base.Enum | |||||||||||||||||||||||||
(SingI d1, SingI d2) => SingI (EfdtNatSym2 d1 d2 :: TyFun Natural [Natural] -> Type) | |||||||||||||||||||||||||
Defined in Data.Singletons.Base.Enum | |||||||||||||||||||||||||
(SingI d1, SingI d2) => SingI (EfdtNatUpSym2 d1 d2 :: TyFun Natural [Natural] -> Type) | |||||||||||||||||||||||||
Defined in Data.Singletons.Base.Enum | |||||||||||||||||||||||||
SingI d => SingI ((!!@#@$$) d :: TyFun Natural a -> Type) | |||||||||||||||||||||||||
Defined in Data.List.NonEmpty.Singletons | |||||||||||||||||||||||||
SingI x => SingI ((<=?@#@$$) x :: TyFun Natural Bool -> Type) | |||||||||||||||||||||||||
Defined in GHC.TypeLits.Singletons.Internal Methods sing :: Sing ((<=?@#@$$) x) # | |||||||||||||||||||||||||
SuppressUnusedWarnings (Length_6989586621680395200Sym0 :: TyFun (Either a1 a2) Natural -> Type) | |||||||||||||||||||||||||
Defined in Data.Foldable.Singletons Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings (Length_6989586621680395274Sym0 :: TyFun (Proxy a) Natural -> Type) | |||||||||||||||||||||||||
Defined in Data.Foldable.Singletons Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings (FromEnum_6989586621680360303Sym0 :: TyFun (Proxy s) Natural -> Type) | |||||||||||||||||||||||||
Defined in Data.Proxy.Singletons Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings (ToEnum_6989586621680360309Sym0 :: TyFun Natural (Proxy s) -> Type) | |||||||||||||||||||||||||
Defined in Data.Proxy.Singletons Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings (ShowsPrec_6989586621680242690Sym0 :: TyFun Natural (Either a b ~> (Symbol ~> Symbol)) -> Type) | |||||||||||||||||||||||||
Defined in Text.Show.Singletons Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings (ShowsPrec_6989586621680360233Sym0 :: TyFun Natural (Proxy s ~> (Symbol ~> Symbol)) -> Type) | |||||||||||||||||||||||||
Defined in Data.Proxy.Singletons Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings (ShowsPrec_6989586621680889674Sym0 :: TyFun Natural (Arg a b ~> (Symbol ~> Symbol)) -> Type) | |||||||||||||||||||||||||
Defined in Data.Semigroup.Singletons Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings (ShowsPrec_6989586621680212368Sym0 :: TyFun Natural ((a, b) ~> (Symbol ~> Symbol)) -> Type) | |||||||||||||||||||||||||
Defined in Text.Show.Singletons Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings (ReplicateM_Sym0 :: TyFun Natural (m a ~> m ()) -> Type) | |||||||||||||||||||||||||
Defined in Control.Monad.Singletons Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings (ReplicateMSym0 :: TyFun Natural (m a ~> m [a]) -> Type) | |||||||||||||||||||||||||
Defined in Control.Monad.Singletons Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings (EfdtNatDnSym2 a6989586621679610288 a6989586621679610289 :: TyFun Natural [Natural] -> Type) | |||||||||||||||||||||||||
Defined in Data.Singletons.Base.Enum Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings (EfdtNatSym2 a6989586621679610362 a6989586621679610363 :: TyFun Natural [Natural] -> Type) | |||||||||||||||||||||||||
Defined in Data.Singletons.Base.Enum Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings (EfdtNatUpSym2 a6989586621679610325 a6989586621679610326 :: TyFun Natural [Natural] -> Type) | |||||||||||||||||||||||||
Defined in Data.Singletons.Base.Enum Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings (EnumFromThenTo_6989586621679610519Sym2 a6989586621679610531 a6989586621679610532 :: TyFun Natural [Natural] -> Type) | |||||||||||||||||||||||||
Defined in Data.Singletons.Base.Enum Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings ((!!@#@$$) a6989586621681126560 :: TyFun Natural a -> Type) | |||||||||||||||||||||||||
Defined in Data.List.NonEmpty.Singletons Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SFoldable t => SingI (LengthSym0 :: TyFun (t a) Natural -> Type) | |||||||||||||||||||||||||
Defined in Data.Foldable.Singletons | |||||||||||||||||||||||||
SuppressUnusedWarnings (FromEnum_6989586621680687143Sym0 :: TyFun (Const a b) Natural -> Type) | |||||||||||||||||||||||||
Defined in Data.Functor.Const.Singletons Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings (FromInteger_6989586621680687233Sym0 :: TyFun Natural (Const a b) -> Type) | |||||||||||||||||||||||||
Defined in Data.Functor.Const.Singletons Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings (ToEnum_6989586621680687136Sym0 :: TyFun Natural (Const a b) -> Type) | |||||||||||||||||||||||||
Defined in Data.Functor.Const.Singletons Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings (ShowsPrec_6989586621680687253Sym0 :: TyFun Natural (Const a b ~> (Symbol ~> Symbol)) -> Type) | |||||||||||||||||||||||||
Defined in Data.Functor.Const.Singletons Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings (ShowsPrec_6989586621680212383Sym0 :: TyFun Natural ((a, b, c) ~> (Symbol ~> Symbol)) -> Type) | |||||||||||||||||||||||||
Defined in Text.Show.Singletons Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings (Let6989586621681302691LoopSym0 :: TyFun (Type -> Type) (TyFun Type (TyFun k (TyFun (m6989586621681302314 a6989586621681302315) (TyFun Natural (m6989586621681302314 [a6989586621681302315]) -> Type) -> Type) -> Type) -> Type) -> Type) | |||||||||||||||||||||||||
Defined in Control.Monad.Singletons Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings (LengthSym0 :: TyFun (t a) Natural -> Type) | |||||||||||||||||||||||||
Defined in Data.Foldable.Singletons Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings (Length_6989586621680394782Sym0 :: TyFun (t a) Natural -> Type) | |||||||||||||||||||||||||
Defined in Data.Foldable.Singletons Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings (ShowsPrec_6989586621680212399Sym0 :: TyFun Natural ((a, b, c, d) ~> (Symbol ~> Symbol)) -> Type) | |||||||||||||||||||||||||
Defined in Text.Show.Singletons Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings (Let6989586621681302673LoopSym0 :: TyFun (Type -> Type) (TyFun k1 (TyFun k2 (TyFun (m6989586621681302312 a) (TyFun Natural (m6989586621681302312 ()) -> Type) -> Type) -> Type) -> Type) -> Type) | |||||||||||||||||||||||||
Defined in Control.Monad.Singletons Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings (Let6989586621681302691LoopSym1 m2 :: TyFun Type (TyFun k (TyFun (m1 a6989586621681302315) (TyFun Natural (m1 [a6989586621681302315]) -> Type) -> Type) -> Type) -> Type) | |||||||||||||||||||||||||
Defined in Control.Monad.Singletons Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings (ShowsPrec_6989586621680212416Sym0 :: TyFun Natural ((a, b, c, d, e) ~> (Symbol ~> Symbol)) -> Type) | |||||||||||||||||||||||||
Defined in Text.Show.Singletons Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings (Let6989586621681302691LoopSym4 m6989586621681302314 a6989586621681302315 cnt06989586621681302689 f6989586621681302690 :: TyFun Natural (m6989586621681302314 [a6989586621681302315]) -> Type) | |||||||||||||||||||||||||
Defined in Control.Monad.Singletons Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings (Let6989586621681302691LoopSym2 m2 a2 :: TyFun k (TyFun (m1 a1) (TyFun Natural (m1 [a1]) -> Type) -> Type) -> Type) | |||||||||||||||||||||||||
Defined in Control.Monad.Singletons Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings (Let6989586621681302673LoopSym1 m2 :: TyFun k1 (TyFun k2 (TyFun (m1 a) (TyFun Natural (m1 ()) -> Type) -> Type) -> Type) -> Type) | |||||||||||||||||||||||||
Defined in Control.Monad.Singletons Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings (ShowsPrec_6989586621680212434Sym0 :: TyFun Natural ((a, b, c, d, e, f) ~> (Symbol ~> Symbol)) -> Type) | |||||||||||||||||||||||||
Defined in Text.Show.Singletons Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings (Let6989586621681302673LoopSym2 m2 a6989586621681302313 :: TyFun k2 (TyFun (m1 a) (TyFun Natural (m1 ()) -> Type) -> Type) -> Type) | |||||||||||||||||||||||||
Defined in Control.Monad.Singletons Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings (Let6989586621681302691LoopSym3 m2 a2 cnt06989586621681302689 :: TyFun (m1 a1) (TyFun Natural (m1 [a1]) -> Type) -> Type) | |||||||||||||||||||||||||
Defined in Control.Monad.Singletons Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings (ShowsPrec_6989586621680212453Sym0 :: TyFun Natural ((a, b, c, d, e, f, g) ~> (Symbol ~> Symbol)) -> Type) | |||||||||||||||||||||||||
Defined in Text.Show.Singletons Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings (Let6989586621681302673LoopSym4 m6989586621681302312 a6989586621681302313 cnt06989586621681302671 f6989586621681302672 :: TyFun Natural (m6989586621681302312 ()) -> Type) | |||||||||||||||||||||||||
Defined in Control.Monad.Singletons Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
SuppressUnusedWarnings (Let6989586621681302673LoopSym3 m2 a6989586621681302313 cnt06989586621681302671 :: TyFun (m1 a) (TyFun Natural (m1 ()) -> Type) -> Type) | |||||||||||||||||||||||||
Defined in Control.Monad.Singletons Methods suppressUnusedWarnings :: () # | |||||||||||||||||||||||||
type Demote Natural | |||||||||||||||||||||||||
Defined in GHC.TypeLits.Singletons.Internal | |||||||||||||||||||||||||
type Sing | |||||||||||||||||||||||||
Defined in GHC.TypeLits.Singletons.Internal | |||||||||||||||||||||||||
type FromEnum (a :: Natural) | |||||||||||||||||||||||||
Defined in Data.Singletons.Base.Enum | |||||||||||||||||||||||||
type Pred (a :: Natural) | |||||||||||||||||||||||||
Defined in Data.Singletons.Base.Enum | |||||||||||||||||||||||||
type Succ (a :: Natural) | |||||||||||||||||||||||||
Defined in Data.Singletons.Base.Enum | |||||||||||||||||||||||||
type ToEnum a | |||||||||||||||||||||||||
Defined in Data.Singletons.Base.Enum | |||||||||||||||||||||||||
type Show_ (arg :: Natural) | |||||||||||||||||||||||||
type Compare (a :: Natural) (b :: Natural) | |||||||||||||||||||||||||
Defined in Data.Type.Ord | |||||||||||||||||||||||||
type (arg :: Natural) /= (arg1 :: Natural) | |||||||||||||||||||||||||
type (x :: Natural) == (y :: Natural) | |||||||||||||||||||||||||
Defined in GHC.TypeLits.Singletons.Internal | |||||||||||||||||||||||||
type (arg :: Natural) < (arg1 :: Natural) | |||||||||||||||||||||||||
type (arg :: Natural) <= (arg1 :: Natural) | |||||||||||||||||||||||||
type (arg :: Natural) > (arg1 :: Natural) | |||||||||||||||||||||||||
type (arg :: Natural) >= (arg1 :: Natural) | |||||||||||||||||||||||||
type Compare (a :: Natural) (b :: Natural) | |||||||||||||||||||||||||
Defined in GHC.TypeLits.Singletons.Internal | |||||||||||||||||||||||||
type Max (arg :: Natural) (arg1 :: Natural) | |||||||||||||||||||||||||
type Min (arg :: Natural) (arg1 :: Natural) | |||||||||||||||||||||||||
type EnumFromTo (a1 :: Natural) (a2 :: Natural) | |||||||||||||||||||||||||
Defined in Data.Singletons.Base.Enum type EnumFromTo (a1 :: Natural) (a2 :: Natural) = Apply (Apply EnumFromTo_6989586621679610503Sym0 a1) a2 | |||||||||||||||||||||||||
type ShowList (arg1 :: [Natural]) arg2 | |||||||||||||||||||||||||
type Apply KnownNatSym0 (a6989586621679563428 :: Nat) | |||||||||||||||||||||||||
Defined in GHC.TypeLits.Singletons | |||||||||||||||||||||||||
type Apply FromEnum_6989586621679638224Sym0 (a6989586621679638228 :: Ordering) | |||||||||||||||||||||||||
Defined in Data.Singletons.Base.Enum | |||||||||||||||||||||||||
type Apply ToEnum_6989586621679638208Sym0 (a6989586621679638212 :: Natural) | |||||||||||||||||||||||||
Defined in Data.Singletons.Base.Enum | |||||||||||||||||||||||||
type Apply FromEnum_6989586621679610495Sym0 (a6989586621679610499 :: Natural) | |||||||||||||||||||||||||
Defined in Data.Singletons.Base.Enum | |||||||||||||||||||||||||
type Apply Pred_6989586621679610481Sym0 (a6989586621679610485 :: Natural) | |||||||||||||||||||||||||
Defined in Data.Singletons.Base.Enum | |||||||||||||||||||||||||
type Apply Succ_6989586621679610474Sym0 (a6989586621679610478 :: Natural) | |||||||||||||||||||||||||
Defined in Data.Singletons.Base.Enum | |||||||||||||||||||||||||
type Apply ToEnum_6989586621679610488Sym0 (a6989586621679610492 :: Natural) | |||||||||||||||||||||||||
Defined in Data.Singletons.Base.Enum | |||||||||||||||||||||||||
type Apply Log2Sym0 (a6989586621679564072 :: Natural) | |||||||||||||||||||||||||
Defined in GHC.TypeLits.Singletons | |||||||||||||||||||||||||
type Apply ToEnum_6989586621679638231Sym0 (a6989586621679638235 :: Natural) | |||||||||||||||||||||||||
Defined in Data.Singletons.Base.Enum | |||||||||||||||||||||||||
type Apply ToEnum_6989586621679638188Sym0 (a6989586621679638192 :: Natural) | |||||||||||||||||||||||||
Defined in Data.Singletons.Base.Enum | |||||||||||||||||||||||||
type Apply ToEnum_6989586621679610538Sym0 (a6989586621679610544 :: Natural) | |||||||||||||||||||||||||
Defined in Data.Singletons.Base.Enum | |||||||||||||||||||||||||
type Apply NatToCharSym0 (a6989586621679567583 :: Natural) | |||||||||||||||||||||||||
Defined in GHC.TypeLits.Singletons | |||||||||||||||||||||||||
type Apply FromEnum_6989586621679638241Sym0 (a6989586621679638245 :: ()) | |||||||||||||||||||||||||
Defined in Data.Singletons.Base.Enum type Apply FromEnum_6989586621679638241Sym0 (a6989586621679638245 :: ()) = FromEnum_6989586621679638241 a6989586621679638245 | |||||||||||||||||||||||||
type Apply FromEnum_6989586621679638201Sym0 (a6989586621679638205 :: Bool) | |||||||||||||||||||||||||
Defined in Data.Singletons.Base.Enum | |||||||||||||||||||||||||
type Apply FromEnum_6989586621679610547Sym0 (a6989586621679610553 :: Char) | |||||||||||||||||||||||||
Defined in Data.Singletons.Base.Enum | |||||||||||||||||||||||||
type Apply CharToNatSym0 (a6989586621679567359 :: Char) | |||||||||||||||||||||||||
Defined in GHC.TypeLits.Singletons | |||||||||||||||||||||||||
type EnumFromThenTo (a1 :: Natural) (a2 :: Natural) (a3 :: Natural) | |||||||||||||||||||||||||
Defined in Data.Singletons.Base.Enum | |||||||||||||||||||||||||
type ShowsPrec _1 (n :: Natural) x | |||||||||||||||||||||||||
Defined in Text.Show.Singletons | |||||||||||||||||||||||||
type Apply (DivSym1 a6989586621679564295 :: TyFun Natural Natural -> Type) (a6989586621679564296 :: Natural) | |||||||||||||||||||||||||
type Apply (ModSym1 a6989586621679564731 :: TyFun Natural Natural -> Type) (a6989586621679564732 :: Natural) | |||||||||||||||||||||||||
type Apply (QuotSym1 a6989586621679565336 :: TyFun Natural Natural -> Type) (a6989586621679565337 :: Natural) | |||||||||||||||||||||||||
type Apply (RemSym1 a6989586621679565325 :: TyFun Natural Natural -> Type) (a6989586621679565326 :: Natural) | |||||||||||||||||||||||||
type Apply ((^@#@$$) a6989586621679553326 :: TyFun Natural Natural -> Type) (a6989586621679553327 :: Natural) | |||||||||||||||||||||||||
type Apply (ToEnumSym0 :: TyFun Natural k2 -> Type) (a6989586621679610409 :: Natural) | |||||||||||||||||||||||||
Defined in Data.Singletons.Base.Enum | |||||||||||||||||||||||||
type Apply (FromEnumSym0 :: TyFun a Natural -> Type) (a6989586621679610412 :: a) | |||||||||||||||||||||||||
Defined in Data.Singletons.Base.Enum | |||||||||||||||||||||||||
type Apply ((!!@#@$$) a6989586621681126560 :: TyFun Natural a -> Type) (a6989586621681126561 :: Natural) | |||||||||||||||||||||||||
type Apply (FromInteger_6989586621680647427Sym0 :: TyFun Natural (Identity a) -> Type) (a6989586621680647431 :: Natural) | |||||||||||||||||||||||||
type Apply (ToEnum_6989586621680647211Sym0 :: TyFun Natural (Identity a) -> Type) (a6989586621680647215 :: Natural) | |||||||||||||||||||||||||
type Apply (ToEnum_6989586621680889806Sym0 :: TyFun Natural (First a) -> Type) (a6989586621680889812 :: Natural) | |||||||||||||||||||||||||
type Apply (ToEnum_6989586621680890014Sym0 :: TyFun Natural (Last a) -> Type) (a6989586621680890020 :: Natural) | |||||||||||||||||||||||||
type Apply (FromInteger_6989586621680889449Sym0 :: TyFun Natural (Max a) -> Type) (a6989586621680889455 :: Natural) | |||||||||||||||||||||||||
type Apply (ToEnum_6989586621680889287Sym0 :: TyFun Natural (Max a) -> Type) (a6989586621680889293 :: Natural) | |||||||||||||||||||||||||
type Apply (FromInteger_6989586621680888684Sym0 :: TyFun Natural (Min a) -> Type) (a6989586621680888690 :: Natural) | |||||||||||||||||||||||||
type Apply (ToEnum_6989586621680888339Sym0 :: TyFun Natural (Min a) -> Type) (a6989586621680888345 :: Natural) | |||||||||||||||||||||||||
type Apply (ToEnum_6989586621680890183Sym0 :: TyFun Natural (WrappedMonoid a) -> Type) (a6989586621680890189 :: Natural) | |||||||||||||||||||||||||
Defined in Data.Semigroup.Singletons type Apply (ToEnum_6989586621680890183Sym0 :: TyFun Natural (WrappedMonoid a) -> Type) (a6989586621680890189 :: Natural) = ToEnum_6989586621680890183 a6989586621680890189 :: WrappedMonoid a | |||||||||||||||||||||||||
type Apply (EftNatSym1 a6989586621679610380 :: TyFun Natural [Natural] -> Type) (a6989586621679610381 :: Natural) | |||||||||||||||||||||||||
type Apply (EnumFromTo_6989586621679610503Sym1 a6989586621679610512 :: TyFun Natural [Natural] -> Type) (a6989586621679610513 :: Natural) | |||||||||||||||||||||||||
type Apply (EfdtNatDnSym2 a6989586621679610288 a6989586621679610289 :: TyFun Natural [Natural] -> Type) (a6989586621679610290 :: Natural) | |||||||||||||||||||||||||
type Apply (EfdtNatSym2 a6989586621679610362 a6989586621679610363 :: TyFun Natural [Natural] -> Type) (a6989586621679610364 :: Natural) | |||||||||||||||||||||||||
type Apply (EfdtNatUpSym2 a6989586621679610325 a6989586621679610326 :: TyFun Natural [Natural] -> Type) (a6989586621679610327 :: Natural) | |||||||||||||||||||||||||
type Apply (EnumFromThenTo_6989586621679610519Sym2 a6989586621679610531 a6989586621679610532 :: TyFun Natural [Natural] -> Type) (a6989586621679610533 :: Natural) | |||||||||||||||||||||||||
type Apply (Let6989586621681302691LoopSym4 m6989586621681302314 a6989586621681302315 cnt06989586621681302689 f6989586621681302690 :: TyFun Natural (m6989586621681302314 [a6989586621681302315]) -> Type) (a6989586621681302692 :: Natural) | |||||||||||||||||||||||||
Defined in Control.Monad.Singletons type Apply (Let6989586621681302691LoopSym4 m6989586621681302314 a6989586621681302315 cnt06989586621681302689 f6989586621681302690 :: TyFun Natural (m6989586621681302314 [a6989586621681302315]) -> Type) (a6989586621681302692 :: Natural) = Let6989586621681302691Loop m6989586621681302314 a6989586621681302315 cnt06989586621681302689 f6989586621681302690 a6989586621681302692 | |||||||||||||||||||||||||
type Apply (Let6989586621681302673LoopSym4 m6989586621681302312 a6989586621681302313 cnt06989586621681302671 f6989586621681302672 :: TyFun Natural (m6989586621681302312 ()) -> Type) (a6989586621681302674 :: Natural) | |||||||||||||||||||||||||
Defined in Control.Monad.Singletons type Apply (Let6989586621681302673LoopSym4 m6989586621681302312 a6989586621681302313 cnt06989586621681302671 f6989586621681302672 :: TyFun Natural (m6989586621681302312 ()) -> Type) (a6989586621681302674 :: Natural) = Let6989586621681302673Loop m6989586621681302312 a6989586621681302313 cnt06989586621681302671 f6989586621681302672 a6989586621681302674 | |||||||||||||||||||||||||
type Apply ShowsPrec_6989586621680870199Sym0 (a6989586621680870207 :: Natural) | |||||||||||||||||||||||||
Defined in Data.Semigroup.Singletons | |||||||||||||||||||||||||
type Apply ShowsPrec_6989586621680870220Sym0 (a6989586621680870228 :: Natural) | |||||||||||||||||||||||||
Defined in Data.Semigroup.Singletons | |||||||||||||||||||||||||
type Apply ShowsPrec_6989586621680242786Sym0 (a6989586621680242794 :: Natural) | |||||||||||||||||||||||||
Defined in Text.Show.Singletons | |||||||||||||||||||||||||
type Apply ShowsPrec_6989586621680242761Sym0 (a6989586621680242773 :: Natural) | |||||||||||||||||||||||||
Defined in Text.Show.Singletons | |||||||||||||||||||||||||
type Apply EfdtNatDnSym0 (a6989586621679610288 :: Natural) | |||||||||||||||||||||||||
Defined in Data.Singletons.Base.Enum | |||||||||||||||||||||||||
type Apply EfdtNatSym0 (a6989586621679610362 :: Natural) | |||||||||||||||||||||||||
Defined in Data.Singletons.Base.Enum | |||||||||||||||||||||||||
type Apply EfdtNatUpSym0 (a6989586621679610325 :: Natural) | |||||||||||||||||||||||||
Defined in Data.Singletons.Base.Enum | |||||||||||||||||||||||||
type Apply EnumFromThenTo_6989586621679610519Sym0 (a6989586621679610531 :: Natural) | |||||||||||||||||||||||||
Defined in Data.Singletons.Base.Enum | |||||||||||||||||||||||||
type Apply DivSym0 (a6989586621679564295 :: Natural) | |||||||||||||||||||||||||
Defined in GHC.TypeLits.Singletons | |||||||||||||||||||||||||
type Apply ModSym0 (a6989586621679564731 :: Natural) | |||||||||||||||||||||||||
Defined in GHC.TypeLits.Singletons | |||||||||||||||||||||||||
type Apply QuotSym0 (a6989586621679565336 :: Natural) | |||||||||||||||||||||||||
Defined in GHC.TypeLits.Singletons | |||||||||||||||||||||||||
type Apply RemSym0 (a6989586621679565325 :: Natural) | |||||||||||||||||||||||||
Defined in GHC.TypeLits.Singletons | |||||||||||||||||||||||||
type Apply (^@#@$) (a6989586621679553326 :: Natural) | |||||||||||||||||||||||||
Defined in GHC.TypeLits.Singletons.Internal | |||||||||||||||||||||||||
type Apply DivModSym0 (a6989586621679565354 :: Natural) | |||||||||||||||||||||||||
Defined in GHC.TypeLits.Singletons | |||||||||||||||||||||||||
type Apply QuotRemSym0 (a6989586621679565347 :: Natural) | |||||||||||||||||||||||||
Defined in GHC.TypeLits.Singletons | |||||||||||||||||||||||||
type Apply EftNatSym0 (a6989586621679610380 :: Natural) | |||||||||||||||||||||||||
Defined in Data.Singletons.Base.Enum | |||||||||||||||||||||||||
type Apply EnumFromTo_6989586621679610503Sym0 (a6989586621679610512 :: Natural) | |||||||||||||||||||||||||
Defined in Data.Singletons.Base.Enum | |||||||||||||||||||||||||
type Apply ShowsPrec_6989586621680242615Sym0 (a6989586621680242623 :: Natural) | |||||||||||||||||||||||||
Defined in Text.Show.Singletons | |||||||||||||||||||||||||
type Apply ShowsPrec_6989586621680242741Sym0 (a6989586621680242751 :: Natural) | |||||||||||||||||||||||||
Defined in Text.Show.Singletons | |||||||||||||||||||||||||
type Apply ShowsCharPrecSym0 (a6989586621680235256 :: Natural) | |||||||||||||||||||||||||
Defined in Text.Show.Singletons | |||||||||||||||||||||||||
type Apply ShowsNatSym0 (a6989586621680233300 :: Natural) | |||||||||||||||||||||||||
Defined in Text.Show.Singletons | |||||||||||||||||||||||||
type Apply (ShowsPrec_6989586621680647477Sym0 :: TyFun Natural (Identity a ~> (Symbol ~> Symbol)) -> Type) (a6989586621680647485 :: Natural) | |||||||||||||||||||||||||
type Apply (ShowsPrec_6989586621680305877Sym0 :: TyFun Natural (First a ~> (Symbol ~> Symbol)) -> Type) (a6989586621680305885 :: Natural) | |||||||||||||||||||||||||
type Apply (ShowsPrec_6989586621680305922Sym0 :: TyFun Natural (Last a ~> (Symbol ~> Symbol)) -> Type) (a6989586621680305930 :: Natural) | |||||||||||||||||||||||||
type Apply (ShowsPrec_6989586621680870340Sym0 :: TyFun Natural (First a ~> (Symbol ~> Symbol)) -> Type) (a6989586621680870348 :: Natural) | |||||||||||||||||||||||||
type Apply (ShowsPrec_6989586621680870364Sym0 :: TyFun Natural (Last a ~> (Symbol ~> Symbol)) -> Type) (a6989586621680870372 :: Natural) | |||||||||||||||||||||||||
type Apply (ShowsPrec_6989586621680870316Sym0 :: TyFun Natural (Max a ~> (Symbol ~> Symbol)) -> Type) (a6989586621680870324 :: Natural) | |||||||||||||||||||||||||
type Apply (ShowsPrec_6989586621680870292Sym0 :: TyFun Natural (Min a ~> (Symbol ~> Symbol)) -> Type) (a6989586621680870300 :: Natural) | |||||||||||||||||||||||||
type Apply (ShowsPrec_6989586621680870388Sym0 :: TyFun Natural (WrappedMonoid m ~> (Symbol ~> Symbol)) -> Type) (a6989586621680870396 :: Natural) | |||||||||||||||||||||||||
type Apply (ShowsPrec_6989586621680870178Sym0 :: TyFun Natural (Dual a ~> (Symbol ~> Symbol)) -> Type) (a6989586621680870186 :: Natural) | |||||||||||||||||||||||||
type Apply (ShowsPrec_6989586621680870268Sym0 :: TyFun Natural (Product a ~> (Symbol ~> Symbol)) -> Type) (a6989586621680870276 :: Natural) | |||||||||||||||||||||||||
type Apply (ShowsPrec_6989586621680870244Sym0 :: TyFun Natural (Sum a ~> (Symbol ~> Symbol)) -> Type) (a6989586621680870252 :: Natural) | |||||||||||||||||||||||||
type Apply (ShowsPrec_6989586621680242721Sym0 :: TyFun Natural (NonEmpty a ~> (Symbol ~> Symbol)) -> Type) (a6989586621680242729 :: Natural) | |||||||||||||||||||||||||
type Apply (SplitAtSym0 :: TyFun Natural (NonEmpty a ~> ([a], [a])) -> Type) (a6989586621681126752 :: Natural) | |||||||||||||||||||||||||
Defined in Data.List.NonEmpty.Singletons | |||||||||||||||||||||||||
type Apply (DropSym0 :: TyFun Natural (NonEmpty a ~> [a]) -> Type) (a6989586621681126761 :: Natural) | |||||||||||||||||||||||||
type Apply (TakeSym0 :: TyFun Natural (NonEmpty a ~> [a]) -> Type) (a6989586621681126770 :: Natural) | |||||||||||||||||||||||||
type Apply (ShowsPrec_6989586621680242644Sym0 :: TyFun Natural (Maybe a ~> (Symbol ~> Symbol)) -> Type) (a6989586621680242654 :: Natural) | |||||||||||||||||||||||||
type Apply (EfdtNatDnSym1 a6989586621679610288 :: TyFun Natural (Natural ~> [Natural]) -> Type) (a6989586621679610289 :: Natural) | |||||||||||||||||||||||||
type Apply (EfdtNatSym1 a6989586621679610362 :: TyFun Natural (Natural ~> [Natural]) -> Type) (a6989586621679610363 :: Natural) | |||||||||||||||||||||||||
type Apply (EfdtNatUpSym1 a6989586621679610325 :: TyFun Natural (Natural ~> [Natural]) -> Type) (a6989586621679610326 :: Natural) | |||||||||||||||||||||||||
type Apply (EnumFromThenTo_6989586621679610519Sym1 a6989586621679610531 :: TyFun Natural (Natural ~> [Natural]) -> Type) (a6989586621679610532 :: Natural) | |||||||||||||||||||||||||
type Apply (ShowsPrec_6989586621680212350Sym0 :: TyFun Natural ([a] ~> (Symbol ~> Symbol)) -> Type) (a6989586621680212360 :: Natural) | |||||||||||||||||||||||||
type Apply (ShowsPrecSym0 :: TyFun Natural (a ~> (Symbol ~> Symbol)) -> Type) (a6989586621680212304 :: Natural) | |||||||||||||||||||||||||
type Apply (ShowsPrec_6989586621680212318Sym0 :: TyFun Natural (a ~> (Symbol ~> Symbol)) -> Type) (a6989586621680212324 :: Natural) | |||||||||||||||||||||||||
type Apply (DivModSym1 a6989586621679565354 :: TyFun Natural (Natural, Natural) -> Type) (a6989586621679565355 :: Natural) | |||||||||||||||||||||||||
Defined in GHC.TypeLits.Singletons | |||||||||||||||||||||||||
type Apply (QuotRemSym1 a6989586621679565347 :: TyFun Natural (Natural, Natural) -> Type) (a6989586621679565348 :: Natural) | |||||||||||||||||||||||||
Defined in GHC.TypeLits.Singletons | |||||||||||||||||||||||||
type Apply (ToEnum_6989586621680360309Sym0 :: TyFun Natural (Proxy s) -> Type) (a6989586621680360313 :: Natural) | |||||||||||||||||||||||||
type Apply (ShowsPrec_6989586621680242690Sym0 :: TyFun Natural (Either a b ~> (Symbol ~> Symbol)) -> Type) (a6989586621680242700 :: Natural) | |||||||||||||||||||||||||
type Apply (ShowsPrec_6989586621680360233Sym0 :: TyFun Natural (Proxy s ~> (Symbol ~> Symbol)) -> Type) (a6989586621680360241 :: Natural) | |||||||||||||||||||||||||
type Apply (ShowsPrec_6989586621680889674Sym0 :: TyFun Natural (Arg a b ~> (Symbol ~> Symbol)) -> Type) (a6989586621680889682 :: Natural) | |||||||||||||||||||||||||
type Apply (ShowsPrec_6989586621680212368Sym0 :: TyFun Natural ((a, b) ~> (Symbol ~> Symbol)) -> Type) (a6989586621680212374 :: Natural) | |||||||||||||||||||||||||
type Apply (ReplicateM_Sym0 :: TyFun Natural (m a ~> m ()) -> Type) (a6989586621681302669 :: Natural) | |||||||||||||||||||||||||
Defined in Control.Monad.Singletons type Apply (ReplicateM_Sym0 :: TyFun Natural (m a ~> m ()) -> Type) (a6989586621681302669 :: Natural) = ReplicateM_Sym1 a6989586621681302669 :: TyFun (m a) (m ()) -> Type | |||||||||||||||||||||||||
type Apply (ReplicateMSym0 :: TyFun Natural (m a ~> m [a]) -> Type) (a6989586621681302687 :: Natural) | |||||||||||||||||||||||||
Defined in Control.Monad.Singletons type Apply (ReplicateMSym0 :: TyFun Natural (m a ~> m [a]) -> Type) (a6989586621681302687 :: Natural) = ReplicateMSym1 a6989586621681302687 :: TyFun (m a) (m [a]) -> Type | |||||||||||||||||||||||||
type Apply (ShowsPrec_6989586621680687253Sym0 :: TyFun Natural (Const a b ~> (Symbol ~> Symbol)) -> Type) (a6989586621680687261 :: Natural) | |||||||||||||||||||||||||
type Apply (ShowsPrec_6989586621680212383Sym0 :: TyFun Natural ((a, b, c) ~> (Symbol ~> Symbol)) -> Type) (a6989586621680212389 :: Natural) | |||||||||||||||||||||||||
type Apply (ShowsPrec_6989586621680212399Sym0 :: TyFun Natural ((a, b, c, d) ~> (Symbol ~> Symbol)) -> Type) (a6989586621680212405 :: Natural) | |||||||||||||||||||||||||
type Apply (Let6989586621681302691LoopSym1 m2 :: TyFun Type (TyFun k (TyFun (m1 a1) (TyFun Natural (m1 [a1]) -> Type) -> Type) -> Type) -> Type) (a2 :: Type) | |||||||||||||||||||||||||
Defined in Control.Monad.Singletons | |||||||||||||||||||||||||
type Apply (ShowsPrec_6989586621680212416Sym0 :: TyFun Natural ((a, b, c, d, e) ~> (Symbol ~> Symbol)) -> Type) (a6989586621680212422 :: Natural) | |||||||||||||||||||||||||
type Apply (Let6989586621681302691LoopSym2 m2 a2 :: TyFun k (TyFun (m1 a1) (TyFun Natural (m1 [a1]) -> Type) -> Type) -> Type) (cnt06989586621681302689 :: k) | |||||||||||||||||||||||||
Defined in Control.Monad.Singletons | |||||||||||||||||||||||||
type Apply (Let6989586621681302673LoopSym1 m2 :: TyFun k1 (TyFun k2 (TyFun (m1 a) (TyFun Natural (m1 ()) -> Type) -> Type) -> Type) -> Type) (a6989586621681302313 :: k1) | |||||||||||||||||||||||||
Defined in Control.Monad.Singletons type Apply (Let6989586621681302673LoopSym1 m2 :: TyFun k1 (TyFun k2 (TyFun (m1 a) (TyFun Natural (m1 ()) -> Type) -> Type) -> Type) -> Type) (a6989586621681302313 :: k1) = Let6989586621681302673LoopSym2 m2 a6989586621681302313 :: TyFun k2 (TyFun (m1 a) (TyFun Natural (m1 ()) -> Type) -> Type) -> Type | |||||||||||||||||||||||||
type Apply (ShowsPrec_6989586621680212434Sym0 :: TyFun Natural ((a, b, c, d, e, f) ~> (Symbol ~> Symbol)) -> Type) (a6989586621680212440 :: Natural) | |||||||||||||||||||||||||
type Apply (Let6989586621681302673LoopSym2 m2 a6989586621681302313 :: TyFun k2 (TyFun (m1 a) (TyFun Natural (m1 ()) -> Type) -> Type) -> Type) (cnt06989586621681302671 :: k2) | |||||||||||||||||||||||||
Defined in Control.Monad.Singletons type Apply (Let6989586621681302673LoopSym2 m2 a6989586621681302313 :: TyFun k2 (TyFun (m1 a) (TyFun Natural (m1 ()) -> Type) -> Type) -> Type) (cnt06989586621681302671 :: k2) = Let6989586621681302673LoopSym3 m2 a6989586621681302313 cnt06989586621681302671 :: TyFun (m1 a) (TyFun Natural (m1 ()) -> Type) -> Type | |||||||||||||||||||||||||
type Apply (ShowsPrec_6989586621680212453Sym0 :: TyFun Natural ((a, b, c, d, e, f, g) ~> (Symbol ~> Symbol)) -> Type) (a6989586621680212459 :: Natural) | |||||||||||||||||||||||||
type Apply (FromInteger_6989586621680687233Sym0 :: TyFun Natural (Const a b) -> Type) (a6989586621680687237 :: Natural) | |||||||||||||||||||||||||
type Apply (ToEnum_6989586621680687136Sym0 :: TyFun Natural (Const a b) -> Type) (a6989586621680687140 :: Natural) | |||||||||||||||||||||||||
type Apply (FromEnum_6989586621680647218Sym0 :: TyFun (Identity a) Natural -> Type) (a6989586621680647222 :: Identity a) | |||||||||||||||||||||||||
type Apply (Length_6989586621680648801Sym0 :: TyFun (Identity a) Natural -> Type) (a6989586621680648805 :: Identity a) | |||||||||||||||||||||||||
type Apply (FromEnum_6989586621680889815Sym0 :: TyFun (First a) Natural -> Type) (a6989586621680889819 :: First a) | |||||||||||||||||||||||||
type Apply (FromEnum_6989586621680890023Sym0 :: TyFun (Last a) Natural -> Type) (a6989586621680890027 :: Last a) | |||||||||||||||||||||||||
type Apply (FromEnum_6989586621680889296Sym0 :: TyFun (Max a) Natural -> Type) (a6989586621680889300 :: Max a) | |||||||||||||||||||||||||
type Apply (FromEnum_6989586621680888348Sym0 :: TyFun (Min a) Natural -> Type) (a6989586621680888352 :: Min a) | |||||||||||||||||||||||||
type Apply (FromEnum_6989586621680890192Sym0 :: TyFun (WrappedMonoid a) Natural -> Type) (a6989586621680890196 :: WrappedMonoid a) | |||||||||||||||||||||||||
Defined in Data.Semigroup.Singletons type Apply (FromEnum_6989586621680890192Sym0 :: TyFun (WrappedMonoid a) Natural -> Type) (a6989586621680890196 :: WrappedMonoid a) = FromEnum_6989586621680890192 a6989586621680890196 | |||||||||||||||||||||||||
type Apply (Length_6989586621680395427Sym0 :: TyFun (Dual a) Natural -> Type) (a6989586621680395431 :: Dual a) | |||||||||||||||||||||||||
type Apply (Length_6989586621680395777Sym0 :: TyFun (Product a) Natural -> Type) (a6989586621680395781 :: Product a) | |||||||||||||||||||||||||
type Apply (Length_6989586621680395602Sym0 :: TyFun (Sum a) Natural -> Type) (a6989586621680395606 :: Sum a) | |||||||||||||||||||||||||
type Apply (LengthSym0 :: TyFun (NonEmpty a) Natural -> Type) (a6989586621681126985 :: NonEmpty a) | |||||||||||||||||||||||||
Defined in Data.List.NonEmpty.Singletons | |||||||||||||||||||||||||
type Apply (Length_6989586621680395018Sym0 :: TyFun [a] Natural -> Type) (a6989586621680395024 :: [a]) | |||||||||||||||||||||||||
Defined in Data.Foldable.Singletons | |||||||||||||||||||||||||
type Apply (LengthSym0 :: TyFun (t a) Natural -> Type) (a6989586621680394597 :: t a) | |||||||||||||||||||||||||
Defined in Data.Foldable.Singletons | |||||||||||||||||||||||||
type Apply (Length_6989586621680394782Sym0 :: TyFun (t a) Natural -> Type) (a6989586621680394788 :: t a) | |||||||||||||||||||||||||
Defined in Data.Foldable.Singletons | |||||||||||||||||||||||||
type Apply ((!!@#@$) :: TyFun (NonEmpty a) (Natural ~> a) -> Type) (a6989586621681126560 :: NonEmpty a) | |||||||||||||||||||||||||
type Apply (Let6989586621681302691LoopSym3 m6989586621681302314 a6989586621681302315 cnt06989586621681302689 :: TyFun (m6989586621681302314 a6989586621681302315) (TyFun Natural (m6989586621681302314 [a6989586621681302315]) -> Type) -> Type) (f6989586621681302690 :: m6989586621681302314 a6989586621681302315) | |||||||||||||||||||||||||
Defined in Control.Monad.Singletons type Apply (Let6989586621681302691LoopSym3 m6989586621681302314 a6989586621681302315 cnt06989586621681302689 :: TyFun (m6989586621681302314 a6989586621681302315) (TyFun Natural (m6989586621681302314 [a6989586621681302315]) -> Type) -> Type) (f6989586621681302690 :: m6989586621681302314 a6989586621681302315) = Let6989586621681302691LoopSym4 m6989586621681302314 a6989586621681302315 cnt06989586621681302689 f6989586621681302690 | |||||||||||||||||||||||||
type Apply (Let6989586621681302673LoopSym3 m6989586621681302312 a6989586621681302313 cnt06989586621681302671 :: TyFun (m6989586621681302312 a) (TyFun Natural (m6989586621681302312 ()) -> Type) -> Type) (f6989586621681302672 :: m6989586621681302312 a) | |||||||||||||||||||||||||
Defined in Control.Monad.Singletons type Apply (Let6989586621681302673LoopSym3 m6989586621681302312 a6989586621681302313 cnt06989586621681302671 :: TyFun (m6989586621681302312 a) (TyFun Natural (m6989586621681302312 ()) -> Type) -> Type) (f6989586621681302672 :: m6989586621681302312 a) = Let6989586621681302673LoopSym4 m6989586621681302312 a6989586621681302313 cnt06989586621681302671 f6989586621681302672 | |||||||||||||||||||||||||
type Apply (Length_6989586621680395200Sym0 :: TyFun (Either a1 a2) Natural -> Type) (a6989586621680395204 :: Either a1 a2) | |||||||||||||||||||||||||
type Apply (Length_6989586621680395274Sym0 :: TyFun (Proxy a) Natural -> Type) (a6989586621680395278 :: Proxy a) | |||||||||||||||||||||||||
type Apply (FromEnum_6989586621680360303Sym0 :: TyFun (Proxy s) Natural -> Type) (a6989586621680360307 :: Proxy s) | |||||||||||||||||||||||||
type Apply (Let6989586621681302691LoopSym0 :: TyFun (Type -> Type) (TyFun Type (TyFun k (TyFun (m1 a6989586621681302315) (TyFun Natural (m1 [a6989586621681302315]) -> Type) -> Type) -> Type) -> Type) -> Type) (m2 :: Type -> Type) | |||||||||||||||||||||||||
Defined in Control.Monad.Singletons type Apply (Let6989586621681302691LoopSym0 :: TyFun (Type -> Type) (TyFun Type (TyFun k (TyFun (m1 a6989586621681302315) (TyFun Natural (m1 [a6989586621681302315]) -> Type) -> Type) -> Type) -> Type) -> Type) (m2 :: Type -> Type) = Let6989586621681302691LoopSym1 m2 :: TyFun Type (TyFun k (TyFun (m1 a6989586621681302315) (TyFun Natural (m1 [a6989586621681302315]) -> Type) -> Type) -> Type) -> Type | |||||||||||||||||||||||||
type Apply (Let6989586621681302673LoopSym0 :: TyFun (Type -> Type) (TyFun k1 (TyFun k2 (TyFun (m1 a) (TyFun Natural (m1 ()) -> Type) -> Type) -> Type) -> Type) -> Type) (m2 :: Type -> Type) | |||||||||||||||||||||||||
Defined in Control.Monad.Singletons type Apply (Let6989586621681302673LoopSym0 :: TyFun (Type -> Type) (TyFun k1 (TyFun k2 (TyFun (m1 a) (TyFun Natural (m1 ()) -> Type) -> Type) -> Type) -> Type) -> Type) (m2 :: Type -> Type) = Let6989586621681302673LoopSym1 m2 :: TyFun k1 (TyFun k2 (TyFun (m1 a) (TyFun Natural (m1 ()) -> Type) -> Type) -> Type) -> Type | |||||||||||||||||||||||||
type Apply (FromEnum_6989586621680687143Sym0 :: TyFun (Const a b) Natural -> Type) (a6989586621680687147 :: Const a b) | |||||||||||||||||||||||||