Copyright | (C) 2013 Richard Eisenberg |
---|---|
License | BSD-style (see LICENSE) |
Maintainer | Richard Eisenberg (eir@cis.upenn.edu) |
Stability | experimental |
Portability | non-portable |
Safe Haskell | None |
Language | Haskell2010 |
This module exports the basic definitions to use singletons. For routine
use, consider importing Prelude
, which exports constructors
for singletons based on types in the Prelude
.
You may also want to read http://www.cis.upenn.edu/~eir/packages/singletons/README.html and the original paper presenting this library, available at http://www.cis.upenn.edu/~eir/papers/2012/singletons/paper.pdf.
- data family Sing (a :: k)
- class SingI a where
- class SingKind k where
- type KindOf a = (Proxy :: Proxy k)
- type Demote a = DemoteRep k
- data SingInstance a where
- SingInstance :: SingI a => SingInstance a
- data SomeSing k where
- singInstance :: forall a. Sing a -> SingInstance a
- withSingI :: Sing n -> (SingI n => r) -> r
- withSomeSing :: SingKind k => DemoteRep k -> (forall a. Sing a -> r) -> r
- singByProxy :: SingI a => proxy a -> Sing a
- singByProxy# :: SingI a => Proxy# a -> Sing a
- withSing :: SingI a => (Sing a -> b) -> b
- singThat :: forall a. (SingKind k, SingI a) => (Demote a -> Bool) -> Maybe (Sing a)
- data TyFun :: * -> * -> *
- type (~>) a b = TyFun a b -> *
- data TyCon1 :: (k1 -> k2) -> k1 ~> k2
- data TyCon2 :: (k1 -> k2 -> k3) -> k1 ~> (k2 ~> k3)
- data TyCon3 :: (k1 -> k2 -> k3 -> k4) -> k1 ~> (k2 ~> (k3 ~> k4))
- data TyCon4 :: (k1 -> k2 -> k3 -> k4 -> k5) -> k1 ~> (k2 ~> (k3 ~> (k4 ~> k5)))
- data TyCon5 :: (k1 -> k2 -> k3 -> k4 -> k5 -> k6) -> k1 ~> (k2 ~> (k3 ~> (k4 ~> (k5 ~> k6))))
- data TyCon6 :: (k1 -> k2 -> k3 -> k4 -> k5 -> k6 -> k7) -> k1 ~> (k2 ~> (k3 ~> (k4 ~> (k5 ~> (k6 ~> k7)))))
- data TyCon7 :: (k1 -> k2 -> k3 -> k4 -> k5 -> k6 -> k7 -> k8) -> k1 ~> (k2 ~> (k3 ~> (k4 ~> (k5 ~> (k6 ~> (k7 ~> k8))))))
- data TyCon8 :: (k1 -> k2 -> k3 -> k4 -> k5 -> k6 -> k7 -> k8 -> k9) -> k1 ~> (k2 ~> (k3 ~> (k4 ~> (k5 ~> (k6 ~> (k7 ~> (k8 ~> k9)))))))
- type family Apply (f :: k1 ~> k2) (x :: k1) :: k2
- type (@@) a b = Apply a b
- singFun1 :: Proxy f -> SingFunction1 f -> Sing f
- singFun2 :: Proxy f -> SingFunction2 f -> Sing f
- singFun3 :: Proxy f -> SingFunction3 f -> Sing f
- singFun4 :: Proxy f -> SingFunction4 f -> Sing f
- singFun5 :: Proxy f -> SingFunction5 f -> Sing f
- singFun6 :: Proxy f -> SingFunction6 f -> Sing f
- singFun7 :: Proxy f -> SingFunction7 f -> Sing f
- singFun8 :: Proxy f -> SingFunction8 f -> Sing f
- unSingFun1 :: Proxy f -> Sing f -> SingFunction1 f
- unSingFun2 :: Proxy f -> Sing f -> SingFunction2 f
- unSingFun3 :: Proxy f -> Sing f -> SingFunction3 f
- unSingFun4 :: Proxy f -> Sing f -> SingFunction4 f
- unSingFun5 :: Proxy f -> Sing f -> SingFunction5 f
- unSingFun6 :: Proxy f -> Sing f -> SingFunction6 f
- unSingFun7 :: Proxy f -> Sing f -> SingFunction7 f
- unSingFun8 :: Proxy f -> Sing f -> SingFunction8 f
- type SingFunction1 f = forall t. Sing t -> Sing (f @@ t)
- type SingFunction2 f = forall t. Sing t -> SingFunction1 (f @@ t)
- type SingFunction3 f = forall t. Sing t -> SingFunction2 (f @@ t)
- type SingFunction4 f = forall t. Sing t -> SingFunction3 (f @@ t)
- type SingFunction5 f = forall t. Sing t -> SingFunction4 (f @@ t)
- type SingFunction6 f = forall t. Sing t -> SingFunction5 (f @@ t)
- type SingFunction7 f = forall t. Sing t -> SingFunction6 (f @@ t)
- type SingFunction8 f = forall t. Sing t -> SingFunction7 (f @@ t)
- data Proxy k t :: forall k. k -> * = Proxy
Main singleton definitions
data family Sing (a :: k) Source #
The singleton kind-indexed data family.
data Sing Bool Source # | |
data Sing Ordering Source # | |
data Sing * Source # | |
data Sing Nat Source # | |
data Sing Symbol Source # | |
data Sing () Source # | |
data Sing [a0] Source # | |
data Sing (Maybe a0) Source # | |
data Sing (NonEmpty a0) Source # | |
data Sing (Either a0 b0) Source # | |
data Sing (a0, b0) Source # | |
data Sing ((~>) k1 k2) Source # | |
data Sing (a0, b0, c0) Source # | |
data Sing (a0, b0, c0, d0) Source # | |
data Sing (a0, b0, c0, d0, e0) Source # | |
data Sing (a0, b0, c0, d0, e0, f0) Source # | |
data Sing (a0, b0, c0, d0, e0, f0, g0) Source # | |
See also Sing
for exported constructors
class SingKind k where Source #
The SingKind
class is a kind class. It classifies all kinds
for which singletons are defined. The class supports converting between a singleton
type and the base (unrefined) type which it is built from.
type DemoteRep k :: * Source #
Get a base type from a proxy for the promoted kind. For example,
DemoteRep Bool
will be the type Bool
.
Working with singletons
type KindOf a = (Proxy :: Proxy k) Source #
Convenient synonym to refer to the kind of a type variable:
type KindOf (a :: k) = ('Proxy :: Proxy k)
type Demote a = DemoteRep k Source #
Convenient abbreviation for DemoteRep
:
type Demote (a :: k) = DemoteRep k
data SingInstance a where Source #
A SingInstance
wraps up a SingI
instance for explicit handling.
SingInstance :: SingI a => SingInstance a |
data SomeSing k where Source #
An existentially-quantified singleton. This type is useful when you want a singleton type, but there is no way of knowing, at compile-time, what the type index will be. To make use of this type, you will generally have to use a pattern-match:
foo :: Bool -> ... foo b = case toSing b of SomeSing sb -> {- fancy dependently-typed code with sb -}
An example like the one above may be easier to write using withSomeSing
.
singInstance :: forall a. Sing a -> SingInstance a Source #
Get an implicit singleton (a SingI
instance) from an explicit one.
withSingI :: Sing n -> (SingI n => r) -> r Source #
Convenience function for creating a context with an implicit singleton available.
:: SingKind k | |
=> DemoteRep k | The original datatype |
-> (forall a. Sing a -> r) | Function expecting a singleton |
-> r |
Convert a normal datatype (like Bool
) to a singleton for that datatype,
passing it into a continuation.
singByProxy :: SingI a => proxy a -> Sing a Source #
Allows creation of a singleton when a proxy is at hand.
singByProxy# :: SingI a => Proxy# a -> Sing a Source #
Allows creation of a singleton when a proxy#
is at hand.
withSing :: SingI a => (Sing a -> b) -> b Source #
A convenience function useful when we need to name a singleton value
multiple times. Without this function, each use of sing
could potentially
refer to a different singleton, and one has to use type signatures (often
with ScopedTypeVariables
) to ensure that they are the same.
singThat :: forall a. (SingKind k, SingI a) => (Demote a -> Bool) -> Maybe (Sing a) Source #
A convenience function that names a singleton satisfying a certain
property. If the singleton does not satisfy the property, then the function
returns Nothing
. The property is expressed in terms of the underlying
representation of the singleton.
Defunctionalization
data TyFun :: * -> * -> * Source #
Representation of the kind of a type-level function. The difference between term-level arrows and this type-level arrow is that at the term level applications can be unsaturated, whereas at the type level all applications have to be fully saturated.
(SingKind k1, SingKind k2) => SingKind ((~>) k1 k2) Source # | |
SuppressUnusedWarnings (Bool -> TyFun Bool Bool -> *) (:&&$$) Source # | |
SuppressUnusedWarnings (Bool -> TyFun Bool Bool -> *) (:||$$) Source # | |
SuppressUnusedWarnings (Ordering -> TyFun Ordering Ordering -> *) ThenCmpSym1 Source # | |
SuppressUnusedWarnings (Nat -> TyFun Nat Nat -> *) (:^$$) Source # | |
SuppressUnusedWarnings (TyFun Bool Bool -> *) NotSym0 Source # | |
SuppressUnusedWarnings (TyFun Bool (TyFun Bool Bool -> Type) -> *) (:&&$) Source # | |
SuppressUnusedWarnings (TyFun Bool (TyFun Bool Bool -> Type) -> *) (:||$) Source # | |
SuppressUnusedWarnings (TyFun [Bool] Bool -> *) AndSym0 Source # | |
SuppressUnusedWarnings (TyFun [Bool] Bool -> *) OrSym0 Source # | |
SuppressUnusedWarnings (TyFun Ordering (TyFun Ordering Ordering -> Type) -> *) ThenCmpSym0 Source # | |
SuppressUnusedWarnings (TyFun Nat (TyFun Nat Nat -> *) -> *) (:^$) Source # | |
SuppressUnusedWarnings ((TyFun a1627845465 Bool -> Type) -> TyFun (TyFun a1627845465 a1627845465 -> Type) (TyFun a1627845465 a1627845465 -> Type) -> *) (UntilSym1 a1627845465) Source # | |
SuppressUnusedWarnings ((TyFun a1627845465 Bool -> Type) -> (TyFun a1627845465 a1627845465 -> Type) -> TyFun a1627845465 a1627845465 -> *) (UntilSym2 a1627845465) Source # | |
SuppressUnusedWarnings ((TyFun a1627942712 Bool -> Type) -> TyFun [a1627942712] Bool -> *) (Any_Sym1 a1627942712) Source # | |
SuppressUnusedWarnings ((TyFun a1627953310 Bool -> Type) -> TyFun [a1627953310] [a1627953310] -> *) (DropWhileEndSym1 a1627953310) Source # | |
SuppressUnusedWarnings ((TyFun a1627953394 (TyFun a1627953394 a1627953394 -> Type) -> Type) -> TyFun [a1627953394] a1627953394 -> *) (Foldl1'Sym1 a1627953394) Source # | |
SuppressUnusedWarnings ((TyFun a1627953321 (TyFun a1627953321 Ordering -> Type) -> Type) -> TyFun [a1627953321] a1627953321 -> *) (MinimumBySym1 a1627953321) Source # | |
SuppressUnusedWarnings ((TyFun a1627953322 (TyFun a1627953322 Ordering -> Type) -> Type) -> TyFun [a1627953322] a1627953322 -> *) (MaximumBySym1 a1627953322) Source # | |
SuppressUnusedWarnings ((TyFun a1627953395 (TyFun a1627953395 a1627953395 -> Type) -> Type) -> TyFun [a1627953395] a1627953395 -> *) (Foldl1Sym1 a1627953395) Source # | |
SuppressUnusedWarnings ((TyFun a1627953393 (TyFun a1627953393 a1627953393 -> Type) -> Type) -> TyFun [a1627953393] a1627953393 -> *) (Foldr1Sym1 a1627953393) Source # | |
SuppressUnusedWarnings ((TyFun a1627953389 Bool -> Type) -> TyFun [a1627953389] Bool -> *) (AllSym1 a1627953389) Source # | |
SuppressUnusedWarnings ((TyFun a1627953386 (TyFun a1627953386 a1627953386 -> Type) -> Type) -> TyFun [a1627953386] [a1627953386] -> *) (Scanl1Sym1 a1627953386) Source # | |
SuppressUnusedWarnings ((TyFun a1627953383 (TyFun a1627953383 a1627953383 -> Type) -> Type) -> TyFun [a1627953383] [a1627953383] -> *) (Scanr1Sym1 a1627953383) Source # | |
SuppressUnusedWarnings ((TyFun a1627953316 Bool -> Type) -> TyFun [a1627953316] (Maybe Nat) -> *) (FindIndexSym1 a1627953316) Source # | |
SuppressUnusedWarnings ((TyFun a1627953315 Bool -> Type) -> TyFun [a1627953315] [Nat] -> *) (FindIndicesSym1 a1627953315) Source # | |
SuppressUnusedWarnings ((TyFun a1627953285 (TyFun a1627953285 Bool -> Type) -> Type) -> TyFun [a1627953285] (TyFun [a1627953285] [a1627953285] -> Type) -> *) (UnionBySym1 a1627953285) Source # | |
SuppressUnusedWarnings ((TyFun a1627953285 (TyFun a1627953285 Bool -> Type) -> Type) -> [a1627953285] -> TyFun [a1627953285] [a1627953285] -> *) (UnionBySym2 a1627953285) Source # | |
SuppressUnusedWarnings ((TyFun a1627953325 (TyFun a1627953325 Bool -> Type) -> Type) -> TyFun [a1627953325] (TyFun [a1627953325] [a1627953325] -> Type) -> *) (DeleteFirstsBySym1 a1627953325) Source # | |
SuppressUnusedWarnings ((TyFun a1627953325 (TyFun a1627953325 Bool -> Type) -> Type) -> [a1627953325] -> TyFun [a1627953325] [a1627953325] -> *) (DeleteFirstsBySym2 a1627953325) Source # | |
SuppressUnusedWarnings ((TyFun a1627953326 (TyFun a1627953326 Bool -> Type) -> Type) -> TyFun a1627953326 (TyFun [a1627953326] [a1627953326] -> Type) -> *) (DeleteBySym1 a1627953326) Source # | |
SuppressUnusedWarnings ((TyFun a1627953326 (TyFun a1627953326 Bool -> Type) -> Type) -> a1627953326 -> TyFun [a1627953326] [a1627953326] -> *) (DeleteBySym2 a1627953326) Source # | |
SuppressUnusedWarnings ((TyFun a1627953324 (TyFun a1627953324 Ordering -> Type) -> Type) -> TyFun [a1627953324] [a1627953324] -> *) (SortBySym1 a1627953324) Source # | |
SuppressUnusedWarnings ((TyFun a1627953323 (TyFun a1627953323 Ordering -> Type) -> Type) -> TyFun a1627953323 (TyFun [a1627953323] [a1627953323] -> Type) -> *) (InsertBySym1 a1627953323) Source # | |
SuppressUnusedWarnings ((TyFun a1627953323 (TyFun a1627953323 Ordering -> Type) -> Type) -> a1627953323 -> TyFun [a1627953323] [a1627953323] -> *) (InsertBySym2 a1627953323) Source # | |
SuppressUnusedWarnings ((TyFun a1627953313 (TyFun a1627953313 Bool -> Type) -> Type) -> TyFun [a1627953313] (TyFun [a1627953313] [a1627953313] -> Type) -> *) (IntersectBySym1 a1627953313) Source # | |
SuppressUnusedWarnings ((TyFun a1627953313 (TyFun a1627953313 Bool -> Type) -> Type) -> [a1627953313] -> TyFun [a1627953313] [a1627953313] -> *) (IntersectBySym2 a1627953313) Source # | |
SuppressUnusedWarnings ((TyFun a1627953319 Bool -> Type) -> TyFun [a1627953319] (Maybe a1627953319) -> *) (FindSym1 a1627953319) Source # | |
SuppressUnusedWarnings ((TyFun a1627953320 Bool -> Type) -> TyFun [a1627953320] [a1627953320] -> *) (FilterSym1 a1627953320) Source # | |
SuppressUnusedWarnings ((TyFun a1627953312 Bool -> Type) -> TyFun [a1627953312] [a1627953312] -> *) (TakeWhileSym1 a1627953312) Source # | |
SuppressUnusedWarnings ((TyFun a1627953311 Bool -> Type) -> TyFun [a1627953311] [a1627953311] -> *) (DropWhileSym1 a1627953311) Source # | |
SuppressUnusedWarnings ((TyFun a1627953299 (TyFun a1627953299 Bool -> Type) -> Type) -> TyFun [a1627953299] [[a1627953299]] -> *) (GroupBySym1 a1627953299) Source # | |
SuppressUnusedWarnings ((TyFun a1627953309 Bool -> Type) -> TyFun [a1627953309] ([a1627953309], [a1627953309]) -> *) (SpanSym1 a1627953309) Source # | |
SuppressUnusedWarnings ((TyFun a1627953308 Bool -> Type) -> TyFun [a1627953308] ([a1627953308], [a1627953308]) -> *) (BreakSym1 a1627953308) Source # | |
SuppressUnusedWarnings ((TyFun a1627953296 Bool -> Type) -> TyFun [a1627953296] ([a1627953296], [a1627953296]) -> *) (PartitionSym1 a1627953296) Source # | |
SuppressUnusedWarnings ((TyFun a1627953287 (TyFun a1627953287 Bool -> Type) -> Type) -> TyFun [a1627953287] [a1627953287] -> *) (NubBySym1 a1627953287) Source # | |
SuppressUnusedWarnings ([a1627796654] -> TyFun [a1627796654] [a1627796654] -> *) ((:++$$) a1627796654) Source # | |
SuppressUnusedWarnings ([a1627953371] -> TyFun [a1627953371] Bool -> *) (IsSuffixOfSym1 a1627953371) Source # | |
SuppressUnusedWarnings ([a1627953402] -> TyFun [[a1627953402]] [a1627953402] -> *) (IntercalateSym1 a1627953402) Source # | |
SuppressUnusedWarnings ([a1627953370] -> TyFun [a1627953370] Bool -> *) (IsInfixOfSym1 a1627953370) Source # | |
SuppressUnusedWarnings ([a1627953372] -> TyFun [a1627953372] Bool -> *) (IsPrefixOfSym1 a1627953372) Source # | |
SuppressUnusedWarnings ([a1627953327] -> TyFun [a1627953327] [a1627953327] -> *) ((:\\$$) a1627953327) Source # | |
SuppressUnusedWarnings ([a1627953284] -> TyFun [a1627953284] [a1627953284] -> *) (UnionSym1 a1627953284) Source # | |
SuppressUnusedWarnings ([a1627953314] -> TyFun [a1627953314] [a1627953314] -> *) (IntersectSym1 a1627953314) Source # | |
SuppressUnusedWarnings ([a1627953289] -> TyFun Nat a1627953289 -> *) ((:!!$$) a1627953289) Source # | |
SuppressUnusedWarnings ([a1628251687] -> TyFun [a1628251687] (Maybe [a1628251687]) -> *) (StripPrefixSym1 a1628251687) Source # | |
SuppressUnusedWarnings (Nat -> TyFun [a1627953305] ([a1627953305], [a1627953305]) -> *) (SplitAtSym1 a1627953305) Source # | |
SuppressUnusedWarnings (Nat -> TyFun [a1627953307] [a1627953307] -> *) (TakeSym1 a1627953307) Source # | |
SuppressUnusedWarnings (Nat -> TyFun [a1627953306] [a1627953306] -> *) (DropSym1 a1627953306) Source # | |
SuppressUnusedWarnings (Nat -> TyFun a1627953291 [a1627953291] -> *) (ReplicateSym1 a1627953291) Source # | |
SuppressUnusedWarnings (a822083586 -> TyFun [a822083586] [a822083586] -> *) ((:$$) a822083586) Source # | |
SuppressUnusedWarnings (a1627657621 -> TyFun a1627657621 (TyFun Bool a1627657621 -> Type) -> *) (Bool_Sym1 a1627657621) Source # | |
SuppressUnusedWarnings (a1627657621 -> a1627657621 -> TyFun Bool a1627657621 -> *) (Bool_Sym2 a1627657621) Source # | |
SuppressUnusedWarnings (a1627662065 -> TyFun a1627662065 Bool -> *) ((:/=$$) a1627662065) Source # | |
SuppressUnusedWarnings (a1627662065 -> TyFun a1627662065 Bool -> *) ((:==$$) a1627662065) Source # | |
SuppressUnusedWarnings (a1627682221 -> TyFun a1627682221 a1627682221 -> *) (MinSym1 a1627682221) Source # | |
SuppressUnusedWarnings (a1627682221 -> TyFun a1627682221 a1627682221 -> *) (MaxSym1 a1627682221) Source # | |
SuppressUnusedWarnings (a1627682221 -> TyFun a1627682221 Bool -> *) ((:>=$$) a1627682221) Source # | |
SuppressUnusedWarnings (a1627682221 -> TyFun a1627682221 Bool -> *) ((:>$$) a1627682221) Source # | |
SuppressUnusedWarnings (a1627682221 -> TyFun a1627682221 Bool -> *) ((:<=$$) a1627682221) Source # | |
SuppressUnusedWarnings (a1627682221 -> TyFun a1627682221 Bool -> *) ((:<$$) a1627682221) Source # | |
SuppressUnusedWarnings (a1627682221 -> TyFun a1627682221 Ordering -> *) (CompareSym1 a1627682221) Source # | |
SuppressUnusedWarnings (a1627796644 -> TyFun a1627796644 a1627796644 -> *) (AsTypeOfSym1 a1627796644) Source # | |
SuppressUnusedWarnings (a1627817219 -> TyFun a1627817219 a1627817219 -> *) ((:*$$) a1627817219) Source # | |
SuppressUnusedWarnings (a1627817219 -> TyFun a1627817219 a1627817219 -> *) ((:-$$) a1627817219) Source # | |
SuppressUnusedWarnings (a1627817219 -> TyFun a1627817219 a1627817219 -> *) ((:+$$) a1627817219) Source # | |
SuppressUnusedWarnings (a1627819601 -> TyFun a1627819601 a1627819601 -> *) (SubtractSym1 a1627819601) Source # | |
SuppressUnusedWarnings (a1627849033 -> TyFun (Maybe a1627849033) a1627849033 -> *) (FromMaybeSym1 a1627849033) Source # | |
SuppressUnusedWarnings (a1627864213 -> TyFun a1627864213 (TyFun a1627864213 [a1627864213] -> Type) -> *) (EnumFromThenToSym1 a1627864213) Source # | |
SuppressUnusedWarnings (a1627864213 -> a1627864213 -> TyFun a1627864213 [a1627864213] -> *) (EnumFromThenToSym2 a1627864213) Source # | |
SuppressUnusedWarnings (a1627864213 -> TyFun a1627864213 [a1627864213] -> *) (EnumFromToSym1 a1627864213) Source # | |
SuppressUnusedWarnings (a1627953403 -> TyFun [a1627953403] [a1627953403] -> *) (IntersperseSym1 a1627953403) Source # | |
SuppressUnusedWarnings (a1627953369 -> TyFun [a1627953369] Bool -> *) (ElemSym1 a1627953369) Source # | |
SuppressUnusedWarnings (a1627953368 -> TyFun [a1627953368] Bool -> *) (NotElemSym1 a1627953368) Source # | |
SuppressUnusedWarnings (a1627953318 -> TyFun [a1627953318] (Maybe Nat) -> *) (ElemIndexSym1 a1627953318) Source # | |
SuppressUnusedWarnings (a1627953317 -> TyFun [a1627953317] [Nat] -> *) (ElemIndicesSym1 a1627953317) Source # | |
SuppressUnusedWarnings (a1627953328 -> TyFun [a1627953328] [a1627953328] -> *) (DeleteSym1 a1627953328) Source # | |
SuppressUnusedWarnings (a1627953301 -> TyFun [a1627953301] [a1627953301] -> *) (InsertSym1 a1627953301) Source # | |
SuppressUnusedWarnings (TyFun (TyFun a1627845465 Bool -> Type) (TyFun (TyFun a1627845465 a1627845465 -> Type) (TyFun a1627845465 a1627845465 -> Type) -> Type) -> *) (UntilSym0 a1627845465) Source # | |
SuppressUnusedWarnings (TyFun (TyFun a1627942712 Bool -> Type) (TyFun [a1627942712] Bool -> Type) -> *) (Any_Sym0 a1627942712) Source # | |
SuppressUnusedWarnings (TyFun (TyFun a1627953310 Bool -> Type) (TyFun [a1627953310] [a1627953310] -> Type) -> *) (DropWhileEndSym0 a1627953310) Source # | |
SuppressUnusedWarnings (TyFun (TyFun a1627953394 (TyFun a1627953394 a1627953394 -> Type) -> Type) (TyFun [a1627953394] a1627953394 -> Type) -> *) (Foldl1'Sym0 a1627953394) Source # | |
SuppressUnusedWarnings (TyFun (TyFun a1627953321 (TyFun a1627953321 Ordering -> Type) -> Type) (TyFun [a1627953321] a1627953321 -> Type) -> *) (MinimumBySym0 a1627953321) Source # | |
SuppressUnusedWarnings (TyFun (TyFun a1627953322 (TyFun a1627953322 Ordering -> Type) -> Type) (TyFun [a1627953322] a1627953322 -> Type) -> *) (MaximumBySym0 a1627953322) Source # | |
SuppressUnusedWarnings (TyFun (TyFun a1627953395 (TyFun a1627953395 a1627953395 -> Type) -> Type) (TyFun [a1627953395] a1627953395 -> Type) -> *) (Foldl1Sym0 a1627953395) Source # | |
SuppressUnusedWarnings (TyFun (TyFun a1627953393 (TyFun a1627953393 a1627953393 -> Type) -> Type) (TyFun [a1627953393] a1627953393 -> Type) -> *) (Foldr1Sym0 a1627953393) Source # | |
SuppressUnusedWarnings (TyFun (TyFun a1627953389 Bool -> Type) (TyFun [a1627953389] Bool -> Type) -> *) (AllSym0 a1627953389) Source # | |
SuppressUnusedWarnings (TyFun (TyFun a1627953386 (TyFun a1627953386 a1627953386 -> Type) -> Type) (TyFun [a1627953386] [a1627953386] -> Type) -> *) (Scanl1Sym0 a1627953386) Source # | |
SuppressUnusedWarnings (TyFun (TyFun a1627953383 (TyFun a1627953383 a1627953383 -> Type) -> Type) (TyFun [a1627953383] [a1627953383] -> Type) -> *) (Scanr1Sym0 a1627953383) Source # | |
SuppressUnusedWarnings (TyFun (TyFun a1627953316 Bool -> Type) (TyFun [a1627953316] (Maybe Nat) -> Type) -> *) (FindIndexSym0 a1627953316) Source # | |
SuppressUnusedWarnings (TyFun (TyFun a1627953315 Bool -> Type) (TyFun [a1627953315] [Nat] -> Type) -> *) (FindIndicesSym0 a1627953315) Source # | |
SuppressUnusedWarnings (TyFun (TyFun a1627953285 (TyFun a1627953285 Bool -> Type) -> Type) (TyFun [a1627953285] (TyFun [a1627953285] [a1627953285] -> Type) -> Type) -> *) (UnionBySym0 a1627953285) Source # | |
SuppressUnusedWarnings (TyFun (TyFun a1627953325 (TyFun a1627953325 Bool -> Type) -> Type) (TyFun [a1627953325] (TyFun [a1627953325] [a1627953325] -> Type) -> Type) -> *) (DeleteFirstsBySym0 a1627953325) Source # | |
SuppressUnusedWarnings (TyFun (TyFun a1627953326 (TyFun a1627953326 Bool -> Type) -> Type) (TyFun a1627953326 (TyFun [a1627953326] [a1627953326] -> Type) -> Type) -> *) (DeleteBySym0 a1627953326) Source # | |
SuppressUnusedWarnings (TyFun (TyFun a1627953324 (TyFun a1627953324 Ordering -> Type) -> Type) (TyFun [a1627953324] [a1627953324] -> Type) -> *) (SortBySym0 a1627953324) Source # | |
SuppressUnusedWarnings (TyFun (TyFun a1627953323 (TyFun a1627953323 Ordering -> Type) -> Type) (TyFun a1627953323 (TyFun [a1627953323] [a1627953323] -> Type) -> Type) -> *) (InsertBySym0 a1627953323) Source # | |
SuppressUnusedWarnings (TyFun (TyFun a1627953313 (TyFun a1627953313 Bool -> Type) -> Type) (TyFun [a1627953313] (TyFun [a1627953313] [a1627953313] -> Type) -> Type) -> *) (IntersectBySym0 a1627953313) Source # | |
SuppressUnusedWarnings (TyFun (TyFun a1627953319 Bool -> Type) (TyFun [a1627953319] (Maybe a1627953319) -> Type) -> *) (FindSym0 a1627953319) Source # | |
SuppressUnusedWarnings (TyFun (TyFun a1627953320 Bool -> Type) (TyFun [a1627953320] [a1627953320] -> Type) -> *) (FilterSym0 a1627953320) Source # | |
SuppressUnusedWarnings (TyFun (TyFun a1627953312 Bool -> Type) (TyFun [a1627953312] [a1627953312] -> Type) -> *) (TakeWhileSym0 a1627953312) Source # | |
SuppressUnusedWarnings (TyFun (TyFun a1627953311 Bool -> Type) (TyFun [a1627953311] [a1627953311] -> Type) -> *) (DropWhileSym0 a1627953311) Source # | |
SuppressUnusedWarnings (TyFun (TyFun a1627953299 (TyFun a1627953299 Bool -> Type) -> Type) (TyFun [a1627953299] [[a1627953299]] -> Type) -> *) (GroupBySym0 a1627953299) Source # | |
SuppressUnusedWarnings (TyFun (TyFun a1627953309 Bool -> Type) (TyFun [a1627953309] ([a1627953309], [a1627953309]) -> Type) -> *) (SpanSym0 a1627953309) Source # | |
SuppressUnusedWarnings (TyFun (TyFun a1627953308 Bool -> Type) (TyFun [a1627953308] ([a1627953308], [a1627953308]) -> Type) -> *) (BreakSym0 a1627953308) Source # | |
SuppressUnusedWarnings (TyFun (TyFun a1627953296 Bool -> Type) (TyFun [a1627953296] ([a1627953296], [a1627953296]) -> Type) -> *) (PartitionSym0 a1627953296) Source # | |
SuppressUnusedWarnings (TyFun (TyFun a1627953287 (TyFun a1627953287 Bool -> Type) -> Type) (TyFun [a1627953287] [a1627953287] -> Type) -> *) (NubBySym0 a1627953287) Source # | |
SuppressUnusedWarnings (TyFun [[a1627953290]] [[a1627953290]] -> *) (TransposeSym0 a1627953290) Source # | |
SuppressUnusedWarnings (TyFun [[a1627953392]] [a1627953392] -> *) (ConcatSym0 a1627953392) Source # | |
SuppressUnusedWarnings (TyFun [Maybe a1627849030] [a1627849030] -> *) (CatMaybesSym0 a1627849030) Source # | |
SuppressUnusedWarnings (TyFun [a1627796654] (TyFun [a1627796654] [a1627796654] -> Type) -> *) ((:++$) a1627796654) Source # | |
SuppressUnusedWarnings (TyFun [a1627849031] (Maybe a1627849031) -> *) (ListToMaybeSym0 a1627849031) Source # | |
SuppressUnusedWarnings (TyFun [a1627953409] a1627953409 -> *) (HeadSym0 a1627953409) Source # | |
SuppressUnusedWarnings (TyFun [a1627953408] a1627953408 -> *) (LastSym0 a1627953408) Source # | |
SuppressUnusedWarnings (TyFun [a1627953407] [a1627953407] -> *) (TailSym0 a1627953407) Source # | |
SuppressUnusedWarnings (TyFun [a1627953406] [a1627953406] -> *) (InitSym0 a1627953406) Source # | |
SuppressUnusedWarnings (TyFun [a1627953405] Bool -> *) (NullSym0 a1627953405) Source # | |
SuppressUnusedWarnings (TyFun [a1627953371] (TyFun [a1627953371] Bool -> Type) -> *) (IsSuffixOfSym0 a1627953371) Source # | |
SuppressUnusedWarnings (TyFun [a1627953404] [a1627953404] -> *) (ReverseSym0 a1627953404) Source # | |
SuppressUnusedWarnings (TyFun [a1627953402] (TyFun [[a1627953402]] [a1627953402] -> Type) -> *) (IntercalateSym0 a1627953402) Source # | |
SuppressUnusedWarnings (TyFun [a1627953401] [[a1627953401]] -> *) (SubsequencesSym0 a1627953401) Source # | |
SuppressUnusedWarnings (TyFun [a1627953398] [[a1627953398]] -> *) (PermutationsSym0 a1627953398) Source # | |
SuppressUnusedWarnings (TyFun [a1627953302] a1627953302 -> *) (MinimumSym0 a1627953302) Source # | |
SuppressUnusedWarnings (TyFun [a1627953303] a1627953303 -> *) (MaximumSym0 a1627953303) Source # | |
SuppressUnusedWarnings (TyFun [a1627953374] [[a1627953374]] -> *) (InitsSym0 a1627953374) Source # | |
SuppressUnusedWarnings (TyFun [a1627953370] (TyFun [a1627953370] Bool -> Type) -> *) (IsInfixOfSym0 a1627953370) Source # | |
SuppressUnusedWarnings (TyFun [a1627953373] [[a1627953373]] -> *) (TailsSym0 a1627953373) Source # | |
SuppressUnusedWarnings (TyFun [a1627953372] (TyFun [a1627953372] Bool -> Type) -> *) (IsPrefixOfSym0 a1627953372) Source # | |
SuppressUnusedWarnings (TyFun [a1627953288] [a1627953288] -> *) (NubSym0 a1627953288) Source # | |
SuppressUnusedWarnings (TyFun [a1627953327] (TyFun [a1627953327] [a1627953327] -> Type) -> *) ((:\\$) a1627953327) Source # | |
SuppressUnusedWarnings (TyFun [a1627953284] (TyFun [a1627953284] [a1627953284] -> Type) -> *) (UnionSym0 a1627953284) Source # | |
SuppressUnusedWarnings (TyFun [a1627953300] [a1627953300] -> *) (SortSym0 a1627953300) Source # | |
SuppressUnusedWarnings (TyFun [a1627953314] (TyFun [a1627953314] [a1627953314] -> Type) -> *) (IntersectSym0 a1627953314) Source # | |
SuppressUnusedWarnings (TyFun [a1627953304] [[a1627953304]] -> *) (GroupSym0 a1627953304) Source # | |
SuppressUnusedWarnings (TyFun [a1627953294] a1627953294 -> *) (SumSym0 a1627953294) Source # | |
SuppressUnusedWarnings (TyFun [a1627953293] a1627953293 -> *) (ProductSym0 a1627953293) Source # | |
SuppressUnusedWarnings (TyFun [a1627953292] Nat -> *) (LengthSym0 a1627953292) Source # | |
SuppressUnusedWarnings (TyFun [a1627953289] (TyFun Nat a1627953289 -> Type) -> *) ((:!!$) a1627953289) Source # | |
SuppressUnusedWarnings (TyFun [a1628251687] (TyFun [a1628251687] (Maybe [a1628251687]) -> Type) -> *) (StripPrefixSym0 a1628251687) Source # | |
SuppressUnusedWarnings (TyFun (Maybe a1627849036) Bool -> *) (IsJustSym0 a1627849036) Source # | |
SuppressUnusedWarnings (TyFun (Maybe a1627849035) Bool -> *) (IsNothingSym0 a1627849035) Source # | |
SuppressUnusedWarnings (TyFun (Maybe a1627849034) a1627849034 -> *) (FromJustSym0 a1627849034) Source # | |
SuppressUnusedWarnings (TyFun (Maybe a1627849032) [a1627849032] -> *) (MaybeToListSym0 a1627849032) Source # | |
SuppressUnusedWarnings (TyFun Nat (TyFun [a1627953305] ([a1627953305], [a1627953305]) -> Type) -> *) (SplitAtSym0 a1627953305) Source # | |
SuppressUnusedWarnings (TyFun Nat (TyFun [a1627953307] [a1627953307] -> Type) -> *) (TakeSym0 a1627953307) Source # | |
SuppressUnusedWarnings (TyFun Nat (TyFun [a1627953306] [a1627953306] -> Type) -> *) (DropSym0 a1627953306) Source # | |
SuppressUnusedWarnings (TyFun Nat (TyFun a1627953291 [a1627953291] -> Type) -> *) (ReplicateSym0 a1627953291) Source # | |
SuppressUnusedWarnings (TyFun Nat a1627817219 -> *) (FromIntegerSym0 a1627817219) Source # | |
SuppressUnusedWarnings (TyFun Nat a1627864213 -> *) (ToEnumSym0 a1627864213) Source # | |
SuppressUnusedWarnings (TyFun a822083586 (TyFun [a822083586] [a822083586] -> Type) -> *) ((:$) a822083586) Source # | |
SuppressUnusedWarnings (TyFun a822083586 (Maybe a822083586) -> *) (JustSym0 a822083586) Source # | |
SuppressUnusedWarnings (TyFun a1627657621 (TyFun a1627657621 (TyFun Bool a1627657621 -> Type) -> Type) -> *) (Bool_Sym0 a1627657621) Source # | |
SuppressUnusedWarnings (TyFun a1627662065 (TyFun a1627662065 Bool -> Type) -> *) ((:/=$) a1627662065) Source # | |
SuppressUnusedWarnings (TyFun a1627662065 (TyFun a1627662065 Bool -> Type) -> *) ((:==$) a1627662065) Source # | |
SuppressUnusedWarnings (TyFun a1627682221 (TyFun a1627682221 a1627682221 -> Type) -> *) (MinSym0 a1627682221) Source # | |
SuppressUnusedWarnings (TyFun a1627682221 (TyFun a1627682221 a1627682221 -> Type) -> *) (MaxSym0 a1627682221) Source # | |
SuppressUnusedWarnings (TyFun a1627682221 (TyFun a1627682221 Bool -> Type) -> *) ((:>=$) a1627682221) Source # | |
SuppressUnusedWarnings (TyFun a1627682221 (TyFun a1627682221 Bool -> Type) -> *) ((:>$) a1627682221) Source # | |
SuppressUnusedWarnings (TyFun a1627682221 (TyFun a1627682221 Bool -> Type) -> *) ((:<=$) a1627682221) Source # | |
SuppressUnusedWarnings (TyFun a1627682221 (TyFun a1627682221 Bool -> Type) -> *) ((:<$) a1627682221) Source # | |
SuppressUnusedWarnings (TyFun a1627682221 (TyFun a1627682221 Ordering -> Type) -> *) (CompareSym0 a1627682221) Source # | |
SuppressUnusedWarnings (TyFun a1627796653 a1627796653 -> *) (IdSym0 a1627796653) Source # | |
SuppressUnusedWarnings (TyFun a1627796644 (TyFun a1627796644 a1627796644 -> Type) -> *) (AsTypeOfSym0 a1627796644) Source # | |
SuppressUnusedWarnings (TyFun a1627817219 a1627817219 -> *) (SignumSym0 a1627817219) Source # | |
SuppressUnusedWarnings (TyFun a1627817219 a1627817219 -> *) (AbsSym0 a1627817219) Source # | |
SuppressUnusedWarnings (TyFun a1627817219 a1627817219 -> *) (NegateSym0 a1627817219) Source # | |
SuppressUnusedWarnings (TyFun a1627817219 (TyFun a1627817219 a1627817219 -> Type) -> *) ((:*$) a1627817219) Source # | |
SuppressUnusedWarnings (TyFun a1627817219 (TyFun a1627817219 a1627817219 -> Type) -> *) ((:-$) a1627817219) Source # | |
SuppressUnusedWarnings (TyFun a1627817219 (TyFun a1627817219 a1627817219 -> Type) -> *) ((:+$) a1627817219) Source # | |
SuppressUnusedWarnings (TyFun a1627819601 (TyFun a1627819601 a1627819601 -> Type) -> *) (SubtractSym0 a1627819601) Source # | |
SuppressUnusedWarnings (TyFun a1627849033 (TyFun (Maybe a1627849033) a1627849033 -> Type) -> *) (FromMaybeSym0 a1627849033) Source # | |
SuppressUnusedWarnings (TyFun a1627864213 (TyFun a1627864213 (TyFun a1627864213 [a1627864213] -> Type) -> Type) -> *) (EnumFromThenToSym0 a1627864213) Source # | |
SuppressUnusedWarnings (TyFun a1627864213 (TyFun a1627864213 [a1627864213] -> Type) -> *) (EnumFromToSym0 a1627864213) Source # | |
SuppressUnusedWarnings (TyFun a1627864213 Nat -> *) (FromEnumSym0 a1627864213) Source # | |
SuppressUnusedWarnings (TyFun a1627864213 a1627864213 -> *) (PredSym0 a1627864213) Source # | |
SuppressUnusedWarnings (TyFun a1627864213 a1627864213 -> *) (SuccSym0 a1627864213) Source # | |
SuppressUnusedWarnings (TyFun a1627953403 (TyFun [a1627953403] [a1627953403] -> Type) -> *) (IntersperseSym0 a1627953403) Source # | |
SuppressUnusedWarnings (TyFun a1627953369 (TyFun [a1627953369] Bool -> Type) -> *) (ElemSym0 a1627953369) Source # | |
SuppressUnusedWarnings (TyFun a1627953368 (TyFun [a1627953368] Bool -> Type) -> *) (NotElemSym0 a1627953368) Source # | |
SuppressUnusedWarnings (TyFun a1627953318 (TyFun [a1627953318] (Maybe Nat) -> Type) -> *) (ElemIndexSym0 a1627953318) Source # | |
SuppressUnusedWarnings (TyFun a1627953317 (TyFun [a1627953317] [Nat] -> Type) -> *) (ElemIndicesSym0 a1627953317) Source # | |
SuppressUnusedWarnings (TyFun a1627953328 (TyFun [a1627953328] [a1627953328] -> Type) -> *) (DeleteSym0 a1627953328) Source # | |
SuppressUnusedWarnings (TyFun a1627953301 (TyFun [a1627953301] [a1627953301] -> Type) -> *) (InsertSym0 a1627953301) Source # | |
SuppressUnusedWarnings ((TyFun b1627619913 (TyFun a1627619912 b1627619913 -> Type) -> Type) -> TyFun b1627619913 (TyFun [a1627619912] b1627619913 -> Type) -> *) (FoldlSym1 a1627619912 b1627619913) Source # | |
SuppressUnusedWarnings ((TyFun b1627619913 (TyFun a1627619912 b1627619913 -> Type) -> Type) -> b1627619913 -> TyFun [a1627619912] b1627619913 -> *) (FoldlSym2 a1627619912 b1627619913) Source # | |
SuppressUnusedWarnings ((TyFun a1627796657 (TyFun b1627796658 b1627796658 -> Type) -> Type) -> TyFun b1627796658 (TyFun [a1627796657] b1627796658 -> Type) -> *) (FoldrSym1 a1627796657 b1627796658) Source # | |
SuppressUnusedWarnings ((TyFun a1627796657 (TyFun b1627796658 b1627796658 -> Type) -> Type) -> b1627796658 -> TyFun [a1627796657] b1627796658 -> *) (FoldrSym2 a1627796657 b1627796658) Source # | |
SuppressUnusedWarnings ((TyFun a1627796655 b1627796656 -> Type) -> TyFun [a1627796655] [b1627796656] -> *) (MapSym1 a1627796655 b1627796656) Source # | |
SuppressUnusedWarnings ((TyFun a1627849028 (Maybe b1627849029) -> Type) -> TyFun [a1627849028] [b1627849029] -> *) (MapMaybeSym1 a1627849028 b1627849029) Source # | |
SuppressUnusedWarnings ((TyFun b1627953397 (TyFun a1627953396 b1627953397 -> Type) -> Type) -> TyFun b1627953397 (TyFun [a1627953396] b1627953397 -> Type) -> *) (Foldl'Sym1 a1627953396 b1627953397) Source # | |
SuppressUnusedWarnings ((TyFun b1627953397 (TyFun a1627953396 b1627953397 -> Type) -> Type) -> b1627953397 -> TyFun [a1627953396] b1627953397 -> *) (Foldl'Sym2 a1627953396 b1627953397) Source # | |
SuppressUnusedWarnings ((TyFun a1627953390 [b1627953391] -> Type) -> TyFun [a1627953390] [b1627953391] -> *) (ConcatMapSym1 a1627953390 b1627953391) Source # | |
SuppressUnusedWarnings ((TyFun b1627953387 (TyFun a1627953388 b1627953387 -> Type) -> Type) -> TyFun b1627953387 (TyFun [a1627953388] [b1627953387] -> Type) -> *) (ScanlSym1 a1627953388 b1627953387) Source # | |
SuppressUnusedWarnings ((TyFun b1627953387 (TyFun a1627953388 b1627953387 -> Type) -> Type) -> b1627953387 -> TyFun [a1627953388] [b1627953387] -> *) (ScanlSym2 a1627953388 b1627953387) Source # | |
SuppressUnusedWarnings ((TyFun a1627953384 (TyFun b1627953385 b1627953385 -> Type) -> Type) -> TyFun b1627953385 (TyFun [a1627953384] [b1627953385] -> Type) -> *) (ScanrSym1 a1627953384 b1627953385) Source # | |
SuppressUnusedWarnings ((TyFun a1627953384 (TyFun b1627953385 b1627953385 -> Type) -> Type) -> b1627953385 -> TyFun [a1627953384] [b1627953385] -> *) (ScanrSym2 a1627953384 b1627953385) Source # | |
SuppressUnusedWarnings ((TyFun b1627953375 (Maybe (a1627953376, b1627953375)) -> Type) -> TyFun b1627953375 [a1627953376] -> *) (UnfoldrSym1 a1627953376 b1627953375) Source # | |
SuppressUnusedWarnings ([a1627953366] -> TyFun [b1627953367] [(a1627953366, b1627953367)] -> *) (ZipSym1 b1627953367 a1627953366) Source # | |
SuppressUnusedWarnings ([a1628251632] -> TyFun i1628251631 a1628251632 -> *) (GenericIndexSym1 i1628251631 a1628251632) Source # | |
SuppressUnusedWarnings (a822083586 -> TyFun b822083587 (a822083586, b822083587) -> *) (Tuple2Sym1 b822083587 a822083586) Source # | |
SuppressUnusedWarnings (a1627796651 -> TyFun b1627796652 a1627796651 -> *) (ConstSym1 b1627796652 a1627796651) Source # | |
SuppressUnusedWarnings (a1627796642 -> TyFun b1627796643 b1627796643 -> *) (SeqSym1 b1627796643 a1627796642) Source # | |
SuppressUnusedWarnings (b1627847771 -> TyFun (TyFun a1627847772 b1627847771 -> Type) (TyFun (Maybe a1627847772) b1627847771 -> Type) -> *) (Maybe_Sym1 a1627847772 b1627847771) Source # | |
SuppressUnusedWarnings (b1627847771 -> (TyFun a1627847772 b1627847771 -> Type) -> TyFun (Maybe a1627847772) b1627847771 -> *) (Maybe_Sym2 a1627847772 b1627847771) Source # | |
SuppressUnusedWarnings (a1627953297 -> TyFun [(a1627953297, b1627953298)] (Maybe b1627953298) -> *) (LookupSym1 b1627953298 a1627953297) Source # | |
SuppressUnusedWarnings (i1628251637 -> TyFun [a1628251638] [a1628251638] -> *) (GenericTakeSym1 a1628251638 i1628251637) Source # | |
SuppressUnusedWarnings (i1628251635 -> TyFun [a1628251636] [a1628251636] -> *) (GenericDropSym1 a1628251636 i1628251635) Source # | |
SuppressUnusedWarnings (i1628251633 -> TyFun [a1628251634] ([a1628251634], [a1628251634]) -> *) (GenericSplitAtSym1 a1628251634 i1628251633) Source # | |
SuppressUnusedWarnings (i1628251629 -> TyFun a1628251630 [a1628251630] -> *) (GenericReplicateSym1 a1628251630 i1628251629) Source # | |
SuppressUnusedWarnings (TyFun (TyFun b1627619913 (TyFun a1627619912 b1627619913 -> Type) -> Type) (TyFun b1627619913 (TyFun [a1627619912] b1627619913 -> Type) -> Type) -> *) (FoldlSym0 a1627619912 b1627619913) Source # | |
SuppressUnusedWarnings (TyFun (TyFun a1627796657 (TyFun b1627796658 b1627796658 -> Type) -> Type) (TyFun b1627796658 (TyFun [a1627796657] b1627796658 -> Type) -> Type) -> *) (FoldrSym0 a1627796657 b1627796658) Source # | |
SuppressUnusedWarnings (TyFun (TyFun a1627796655 b1627796656 -> Type) (TyFun [a1627796655] [b1627796656] -> Type) -> *) (MapSym0 a1627796655 b1627796656) Source # | |
SuppressUnusedWarnings (TyFun (TyFun a1627849028 (Maybe b1627849029) -> Type) (TyFun [a1627849028] [b1627849029] -> Type) -> *) (MapMaybeSym0 a1627849028 b1627849029) Source # | |
SuppressUnusedWarnings (TyFun (TyFun b1627953397 (TyFun a1627953396 b1627953397 -> Type) -> Type) (TyFun b1627953397 (TyFun [a1627953396] b1627953397 -> Type) -> Type) -> *) (Foldl'Sym0 a1627953396 b1627953397) Source # | |
SuppressUnusedWarnings (TyFun (TyFun a1627953390 [b1627953391] -> Type) (TyFun [a1627953390] [b1627953391] -> Type) -> *) (ConcatMapSym0 a1627953390 b1627953391) Source # | |
SuppressUnusedWarnings (TyFun (TyFun b1627953387 (TyFun a1627953388 b1627953387 -> Type) -> Type) (TyFun b1627953387 (TyFun [a1627953388] [b1627953387] -> Type) -> Type) -> *) (ScanlSym0 a1627953388 b1627953387) Source # | |
SuppressUnusedWarnings (TyFun (TyFun a1627953384 (TyFun b1627953385 b1627953385 -> Type) -> Type) (TyFun b1627953385 (TyFun [a1627953384] [b1627953385] -> Type) -> Type) -> *) (ScanrSym0 a1627953384 b1627953385) Source # | |
SuppressUnusedWarnings (TyFun (TyFun b1627953375 (Maybe (a1627953376, b1627953375)) -> Type) (TyFun b1627953375 [a1627953376] -> Type) -> *) (UnfoldrSym0 b1627953375 a1627953376) Source # | |
SuppressUnusedWarnings (TyFun [Either a1627830454 b1627830455] [a1627830454] -> *) (LeftsSym0 b1627830455 a1627830454) Source # | |
SuppressUnusedWarnings (TyFun [Either a1627830452 b1627830453] [b1627830453] -> *) (RightsSym0 a1627830452 b1627830453) Source # | |
SuppressUnusedWarnings (TyFun [(a1627953354, b1627953355)] ([a1627953354], [b1627953355]) -> *) (UnzipSym0 a1627953354 b1627953355) Source # | |
SuppressUnusedWarnings (TyFun [a1627953366] (TyFun [b1627953367] [(a1627953366, b1627953367)] -> Type) -> *) (ZipSym0 a1627953366 b1627953367) Source # | |
SuppressUnusedWarnings (TyFun [a1627953283] i1627953282 -> *) (GenericLengthSym0 a1627953283 i1627953282) Source # | |
SuppressUnusedWarnings (TyFun [a1628251632] (TyFun i1628251631 a1628251632 -> Type) -> *) (GenericIndexSym0 i1628251631 a1628251632) Source # | |
SuppressUnusedWarnings (TyFun (Either a1627830448 b1627830449) Bool -> *) (IsLeftSym0 a1627830448 b1627830449) Source # | |
SuppressUnusedWarnings (TyFun (Either a1627830446 b1627830447) Bool -> *) (IsRightSym0 a1627830446 b1627830447) Source # | |
SuppressUnusedWarnings (TyFun (a1627840729, b1627840730) a1627840729 -> *) (FstSym0 b1627840730 a1627840729) Source # | |
SuppressUnusedWarnings (TyFun (a1627840727, b1627840728) b1627840728 -> *) (SndSym0 a1627840727 b1627840728) Source # | |
SuppressUnusedWarnings (TyFun (a1627840719, b1627840720) (b1627840720, a1627840719) -> *) (SwapSym0 b1627840720 a1627840719) Source # | |
SuppressUnusedWarnings (TyFun a822083586 (TyFun b822083587 (a822083586, b822083587) -> Type) -> *) (Tuple2Sym0 a822083586 b822083587) Source # | |
SuppressUnusedWarnings (TyFun b1627437721 (Either a1627437720 b1627437721) -> *) (RightSym0 a1627437720 b1627437721) Source # | |
SuppressUnusedWarnings (TyFun a1627437720 (Either a1627437720 b1627437721) -> *) (LeftSym0 a1627437720 b1627437721) Source # | |
SuppressUnusedWarnings (TyFun a1627796651 (TyFun b1627796652 a1627796651 -> Type) -> *) (ConstSym0 b1627796652 a1627796651) Source # | |
SuppressUnusedWarnings (TyFun a1627796642 (TyFun b1627796643 b1627796643 -> Type) -> *) (SeqSym0 a1627796642 b1627796643) Source # | |
SuppressUnusedWarnings (TyFun k01627810588 k1627810590 -> *) (ErrorSym0 k01627810588 k1627810590) Source # | |
SuppressUnusedWarnings (TyFun b1627847771 (TyFun (TyFun a1627847772 b1627847771 -> Type) (TyFun (Maybe a1627847772) b1627847771 -> Type) -> Type) -> *) (Maybe_Sym0 a1627847772 b1627847771) Source # | |
SuppressUnusedWarnings (TyFun a1627953297 (TyFun [(a1627953297, b1627953298)] (Maybe b1627953298) -> Type) -> *) (LookupSym0 a1627953297 b1627953298) Source # | |
SuppressUnusedWarnings (TyFun i1628251637 (TyFun [a1628251638] [a1628251638] -> Type) -> *) (GenericTakeSym0 i1628251637 a1628251638) Source # | |
SuppressUnusedWarnings (TyFun i1628251635 (TyFun [a1628251636] [a1628251636] -> Type) -> *) (GenericDropSym0 i1628251635 a1628251636) Source # | |
SuppressUnusedWarnings (TyFun i1628251633 (TyFun [a1628251634] ([a1628251634], [a1628251634]) -> Type) -> *) (GenericSplitAtSym0 i1628251633 a1628251634) Source # | |
SuppressUnusedWarnings (TyFun i1628251629 (TyFun a1628251630 [a1628251630] -> Type) -> *) (GenericReplicateSym0 i1628251629 a1628251630) Source # | |
SuppressUnusedWarnings ((TyFun (a1627840724, b1627840725) c1627840726 -> Type) -> TyFun a1627840724 (TyFun b1627840725 c1627840726 -> Type) -> *) (CurrySym1 a1627840724 b1627840725 c1627840726) Source # | |
SuppressUnusedWarnings ((TyFun (a1627840724, b1627840725) c1627840726 -> Type) -> a1627840724 -> TyFun b1627840725 c1627840726 -> *) (CurrySym2 a1627840724 b1627840725 c1627840726) Source # | |
SuppressUnusedWarnings ((TyFun b1627796648 c1627796649 -> Type) -> TyFun (TyFun a1627796650 b1627796648 -> Type) (TyFun a1627796650 c1627796649 -> Type) -> *) ((:.$$) a1627796650 b1627796648 c1627796649) Source # | |
SuppressUnusedWarnings ((TyFun b1627796648 c1627796649 -> Type) -> (TyFun a1627796650 b1627796648 -> Type) -> TyFun a1627796650 c1627796649 -> *) ((:.$$$) a1627796650 b1627796648 c1627796649) Source # | |
SuppressUnusedWarnings ((TyFun a1627796645 (TyFun b1627796646 c1627796647 -> Type) -> Type) -> TyFun b1627796646 (TyFun a1627796645 c1627796647 -> Type) -> *) (FlipSym1 a1627796645 b1627796646 c1627796647) Source # | |
SuppressUnusedWarnings ((TyFun a1627796645 (TyFun b1627796646 c1627796647 -> Type) -> Type) -> b1627796646 -> TyFun a1627796645 c1627796647 -> *) (FlipSym2 a1627796645 b1627796646 c1627796647) Source # | |
SuppressUnusedWarnings ((TyFun a1627829180 c1627829181 -> Type) -> TyFun (TyFun b1627829182 c1627829181 -> Type) (TyFun (Either a1627829180 b1627829182) c1627829181 -> Type) -> *) (Either_Sym1 b1627829182 a1627829180 c1627829181) Source # | |
SuppressUnusedWarnings ((TyFun a1627829180 c1627829181 -> Type) -> (TyFun b1627829182 c1627829181 -> Type) -> TyFun (Either a1627829180 b1627829182) c1627829181 -> *) (Either_Sym2 b1627829182 a1627829180 c1627829181) Source # | |
SuppressUnusedWarnings ((TyFun a1627840721 (TyFun b1627840722 c1627840723 -> Type) -> Type) -> TyFun (a1627840721, b1627840722) c1627840723 -> *) (UncurrySym1 a1627840721 b1627840722 c1627840723) Source # | |
SuppressUnusedWarnings ((TyFun acc1627953380 (TyFun x1627953381 (acc1627953380, y1627953382) -> Type) -> Type) -> TyFun acc1627953380 (TyFun [x1627953381] (acc1627953380, [y1627953382]) -> Type) -> *) (MapAccumLSym1 x1627953381 acc1627953380 y1627953382) Source # | |
SuppressUnusedWarnings ((TyFun acc1627953380 (TyFun x1627953381 (acc1627953380, y1627953382) -> Type) -> Type) -> acc1627953380 -> TyFun [x1627953381] (acc1627953380, [y1627953382]) -> *) (MapAccumLSym2 x1627953381 acc1627953380 y1627953382) Source # | |
SuppressUnusedWarnings ((TyFun acc1627953377 (TyFun x1627953378 (acc1627953377, y1627953379) -> Type) -> Type) -> TyFun acc1627953377 (TyFun [x1627953378] (acc1627953377, [y1627953379]) -> Type) -> *) (MapAccumRSym1 x1627953378 acc1627953377 y1627953379) Source # | |
SuppressUnusedWarnings ((TyFun acc1627953377 (TyFun x1627953378 (acc1627953377, y1627953379) -> Type) -> Type) -> acc1627953377 -> TyFun [x1627953378] (acc1627953377, [y1627953379]) -> *) (MapAccumRSym2 x1627953378 acc1627953377 y1627953379) Source # | |
SuppressUnusedWarnings ((TyFun a1627953360 (TyFun b1627953361 c1627953362 -> Type) -> Type) -> TyFun [a1627953360] (TyFun [b1627953361] [c1627953362] -> Type) -> *) (ZipWithSym1 a1627953360 b1627953361 c1627953362) Source # | |
SuppressUnusedWarnings ((TyFun a1627953360 (TyFun b1627953361 c1627953362 -> Type) -> Type) -> [a1627953360] -> TyFun [b1627953361] [c1627953362] -> *) (ZipWithSym2 a1627953360 b1627953361 c1627953362) Source # | |
SuppressUnusedWarnings ([a1627953363] -> TyFun [b1627953364] (TyFun [c1627953365] [(a1627953363, b1627953364, c1627953365)] -> Type) -> *) (Zip3Sym1 b1627953364 c1627953365 a1627953363) Source # | |
SuppressUnusedWarnings ([a1627953363] -> [b1627953364] -> TyFun [c1627953365] [(a1627953363, b1627953364, c1627953365)] -> *) (Zip3Sym2 c1627953365 b1627953364 a1627953363) Source # | |
SuppressUnusedWarnings (a822083586 -> TyFun b822083587 (TyFun c822083588 (a822083586, b822083587, c822083588) -> Type) -> *) (Tuple3Sym1 b822083587 c822083588 a822083586) Source # | |
SuppressUnusedWarnings (a822083586 -> b822083587 -> TyFun c822083588 (a822083586, b822083587, c822083588) -> *) (Tuple3Sym2 c822083588 b822083587 a822083586) Source # | |
SuppressUnusedWarnings (TyFun (TyFun (a1627840724, b1627840725) c1627840726 -> Type) (TyFun a1627840724 (TyFun b1627840725 c1627840726 -> Type) -> Type) -> *) (CurrySym0 a1627840724 b1627840725 c1627840726) Source # | |
SuppressUnusedWarnings (TyFun (TyFun b1627796648 c1627796649 -> Type) (TyFun (TyFun a1627796650 b1627796648 -> Type) (TyFun a1627796650 c1627796649 -> Type) -> Type) -> *) ((:.$) b1627796648 a1627796650 c1627796649) Source # | |
SuppressUnusedWarnings (TyFun (TyFun a1627796645 (TyFun b1627796646 c1627796647 -> Type) -> Type) (TyFun b1627796646 (TyFun a1627796645 c1627796647 -> Type) -> Type) -> *) (FlipSym0 b1627796646 a1627796645 c1627796647) Source # | |
SuppressUnusedWarnings (TyFun (TyFun a1627829180 c1627829181 -> Type) (TyFun (TyFun b1627829182 c1627829181 -> Type) (TyFun (Either a1627829180 b1627829182) c1627829181 -> Type) -> Type) -> *) (Either_Sym0 a1627829180 b1627829182 c1627829181) Source # | |
SuppressUnusedWarnings (TyFun (TyFun a1627840721 (TyFun b1627840722 c1627840723 -> Type) -> Type) (TyFun (a1627840721, b1627840722) c1627840723 -> Type) -> *) (UncurrySym0 a1627840721 b1627840722 c1627840723) Source # | |
SuppressUnusedWarnings (TyFun (TyFun acc1627953380 (TyFun x1627953381 (acc1627953380, y1627953382) -> Type) -> Type) (TyFun acc1627953380 (TyFun [x1627953381] (acc1627953380, [y1627953382]) -> Type) -> Type) -> *) (MapAccumLSym0 x1627953381 acc1627953380 y1627953382) Source # | |
SuppressUnusedWarnings (TyFun (TyFun acc1627953377 (TyFun x1627953378 (acc1627953377, y1627953379) -> Type) -> Type) (TyFun acc1627953377 (TyFun [x1627953378] (acc1627953377, [y1627953379]) -> Type) -> Type) -> *) (MapAccumRSym0 x1627953378 acc1627953377 y1627953379) Source # | |
SuppressUnusedWarnings (TyFun (TyFun a1627953360 (TyFun b1627953361 c1627953362 -> Type) -> Type) (TyFun [a1627953360] (TyFun [b1627953361] [c1627953362] -> Type) -> Type) -> *) (ZipWithSym0 a1627953360 b1627953361 c1627953362) Source # | |
SuppressUnusedWarnings (TyFun [(a1627953351, b1627953352, c1627953353)] ([a1627953351], [b1627953352], [c1627953353]) -> *) (Unzip3Sym0 a1627953351 b1627953352 c1627953353) Source # | |
SuppressUnusedWarnings (TyFun [a1627953363] (TyFun [b1627953364] (TyFun [c1627953365] [(a1627953363, b1627953364, c1627953365)] -> Type) -> Type) -> *) (Zip3Sym0 a1627953363 b1627953364 c1627953365) Source # | |
SuppressUnusedWarnings (TyFun a822083586 (TyFun b822083587 (TyFun c822083588 (a822083586, b822083587, c822083588) -> Type) -> Type) -> *) (Tuple3Sym0 a822083586 b822083587 c822083588) Source # | |
SuppressUnusedWarnings ((TyFun a1627953356 (TyFun b1627953357 (TyFun c1627953358 d1627953359 -> Type) -> Type) -> Type) -> TyFun [a1627953356] (TyFun [b1627953357] (TyFun [c1627953358] [d1627953359] -> Type) -> Type) -> *) (ZipWith3Sym1 a1627953356 b1627953357 c1627953358 d1627953359) Source # | |
SuppressUnusedWarnings ((TyFun a1627953356 (TyFun b1627953357 (TyFun c1627953358 d1627953359 -> Type) -> Type) -> Type) -> [a1627953356] -> TyFun [b1627953357] (TyFun [c1627953358] [d1627953359] -> Type) -> *) (ZipWith3Sym2 a1627953356 b1627953357 c1627953358 d1627953359) Source # | |
SuppressUnusedWarnings ((TyFun a1627953356 (TyFun b1627953357 (TyFun c1627953358 d1627953359 -> Type) -> Type) -> Type) -> [a1627953356] -> [b1627953357] -> TyFun [c1627953358] [d1627953359] -> *) (ZipWith3Sym3 a1627953356 b1627953357 c1627953358 d1627953359) Source # | |
SuppressUnusedWarnings ([a1628251683] -> TyFun [b1628251684] (TyFun [c1628251685] (TyFun [d1628251686] [(a1628251683, b1628251684, c1628251685, d1628251686)] -> Type) -> Type) -> *) (Zip4Sym1 b1628251684 c1628251685 d1628251686 a1628251683) Source # | |
SuppressUnusedWarnings ([a1628251683] -> [b1628251684] -> TyFun [c1628251685] (TyFun [d1628251686] [(a1628251683, b1628251684, c1628251685, d1628251686)] -> Type) -> *) (Zip4Sym2 c1628251685 d1628251686 b1628251684 a1628251683) Source # | |
SuppressUnusedWarnings ([a1628251683] -> [b1628251684] -> [c1628251685] -> TyFun [d1628251686] [(a1628251683, b1628251684, c1628251685, d1628251686)] -> *) (Zip4Sym3 d1628251686 c1628251685 b1628251684 a1628251683) Source # | |
SuppressUnusedWarnings (a822083586 -> TyFun b822083587 (TyFun c822083588 (TyFun d822083589 (a822083586, b822083587, c822083588, d822083589) -> Type) -> Type) -> *) (Tuple4Sym1 b822083587 c822083588 d822083589 a822083586) Source # | |
SuppressUnusedWarnings (a822083586 -> b822083587 -> TyFun c822083588 (TyFun d822083589 (a822083586, b822083587, c822083588, d822083589) -> Type) -> *) (Tuple4Sym2 c822083588 d822083589 b822083587 a822083586) Source # | |
SuppressUnusedWarnings (a822083586 -> b822083587 -> c822083588 -> TyFun d822083589 (a822083586, b822083587, c822083588, d822083589) -> *) (Tuple4Sym3 d822083589 c822083588 b822083587 a822083586) Source # | |
SuppressUnusedWarnings (TyFun (TyFun a1627953356 (TyFun b1627953357 (TyFun c1627953358 d1627953359 -> Type) -> Type) -> Type) (TyFun [a1627953356] (TyFun [b1627953357] (TyFun [c1627953358] [d1627953359] -> Type) -> Type) -> Type) -> *) (ZipWith3Sym0 a1627953356 b1627953357 c1627953358 d1627953359) Source # | |
SuppressUnusedWarnings (TyFun [(a1627953347, b1627953348, c1627953349, d1627953350)] ([a1627953347], [b1627953348], [c1627953349], [d1627953350]) -> *) (Unzip4Sym0 a1627953347 b1627953348 c1627953349 d1627953350) Source # | |
SuppressUnusedWarnings (TyFun [a1628251683] (TyFun [b1628251684] (TyFun [c1628251685] (TyFun [d1628251686] [(a1628251683, b1628251684, c1628251685, d1628251686)] -> Type) -> Type) -> Type) -> *) (Zip4Sym0 a1628251683 b1628251684 c1628251685 d1628251686) Source # | |
SuppressUnusedWarnings (TyFun a822083586 (TyFun b822083587 (TyFun c822083588 (TyFun d822083589 (a822083586, b822083587, c822083588, d822083589) -> Type) -> Type) -> Type) -> *) (Tuple4Sym0 a822083586 b822083587 c822083588 d822083589) Source # | |
SuppressUnusedWarnings ((TyFun a1628251660 (TyFun b1628251661 (TyFun c1628251662 (TyFun d1628251663 e1628251664 -> Type) -> Type) -> Type) -> Type) -> TyFun [a1628251660] (TyFun [b1628251661] (TyFun [c1628251662] (TyFun [d1628251663] [e1628251664] -> Type) -> Type) -> Type) -> *) (ZipWith4Sym1 a1628251660 b1628251661 c1628251662 d1628251663 e1628251664) Source # | |
SuppressUnusedWarnings ((TyFun a1628251660 (TyFun b1628251661 (TyFun c1628251662 (TyFun d1628251663 e1628251664 -> Type) -> Type) -> Type) -> Type) -> [a1628251660] -> TyFun [b1628251661] (TyFun [c1628251662] (TyFun [d1628251663] [e1628251664] -> Type) -> Type) -> *) (ZipWith4Sym2 a1628251660 b1628251661 c1628251662 d1628251663 e1628251664) Source # | |
SuppressUnusedWarnings ((TyFun a1628251660 (TyFun b1628251661 (TyFun c1628251662 (TyFun d1628251663 e1628251664 -> Type) -> Type) -> Type) -> Type) -> [a1628251660] -> [b1628251661] -> TyFun [c1628251662] (TyFun [d1628251663] [e1628251664] -> Type) -> *) (ZipWith4Sym3 a1628251660 b1628251661 c1628251662 d1628251663 e1628251664) Source # | |
SuppressUnusedWarnings ((TyFun a1628251660 (TyFun b1628251661 (TyFun c1628251662 (TyFun d1628251663 e1628251664 -> Type) -> Type) -> Type) -> Type) -> [a1628251660] -> [b1628251661] -> [c1628251662] -> TyFun [d1628251663] [e1628251664] -> *) (ZipWith4Sym4 a1628251660 b1628251661 c1628251662 d1628251663 e1628251664) Source # | |
SuppressUnusedWarnings ([a1628251678] -> TyFun [b1628251679] (TyFun [c1628251680] (TyFun [d1628251681] (TyFun [e1628251682] [(a1628251678, b1628251679, c1628251680, d1628251681, e1628251682)] -> Type) -> Type) -> Type) -> *) (Zip5Sym1 b1628251679 c1628251680 d1628251681 e1628251682 a1628251678) Source # | |
SuppressUnusedWarnings ([a1628251678] -> [b1628251679] -> TyFun [c1628251680] (TyFun [d1628251681] (TyFun [e1628251682] [(a1628251678, b1628251679, c1628251680, d1628251681, e1628251682)] -> Type) -> Type) -> *) (Zip5Sym2 c1628251680 d1628251681 e1628251682 b1628251679 a1628251678) Source # | |
SuppressUnusedWarnings ([a1628251678] -> [b1628251679] -> [c1628251680] -> TyFun [d1628251681] (TyFun [e1628251682] [(a1628251678, b1628251679, c1628251680, d1628251681, e1628251682)] -> Type) -> *) (Zip5Sym3 d1628251681 e1628251682 c1628251680 b1628251679 a1628251678) Source # | |
SuppressUnusedWarnings ([a1628251678] -> [b1628251679] -> [c1628251680] -> [d1628251681] -> TyFun [e1628251682] [(a1628251678, b1628251679, c1628251680, d1628251681, e1628251682)] -> *) (Zip5Sym4 e1628251682 d1628251681 c1628251680 b1628251679 a1628251678) Source # | |
SuppressUnusedWarnings (a822083586 -> TyFun b822083587 (TyFun c822083588 (TyFun d822083589 (TyFun e822083590 (a822083586, b822083587, c822083588, d822083589, e822083590) -> Type) -> Type) -> Type) -> *) (Tuple5Sym1 b822083587 c822083588 d822083589 e822083590 a822083586) Source # | |
SuppressUnusedWarnings (a822083586 -> b822083587 -> TyFun c822083588 (TyFun d822083589 (TyFun e822083590 (a822083586, b822083587, c822083588, d822083589, e822083590) -> Type) -> Type) -> *) (Tuple5Sym2 c822083588 d822083589 e822083590 b822083587 a822083586) Source # | |
SuppressUnusedWarnings (a822083586 -> b822083587 -> c822083588 -> TyFun d822083589 (TyFun e822083590 (a822083586, b822083587, c822083588, d822083589, e822083590) -> Type) -> *) (Tuple5Sym3 d822083589 e822083590 c822083588 b822083587 a822083586) Source # | |
SuppressUnusedWarnings (a822083586 -> b822083587 -> c822083588 -> d822083589 -> TyFun e822083590 (a822083586, b822083587, c822083588, d822083589, e822083590) -> *) (Tuple5Sym4 e822083590 d822083589 c822083588 b822083587 a822083586) Source # | |
SuppressUnusedWarnings (TyFun (TyFun a1628251660 (TyFun b1628251661 (TyFun c1628251662 (TyFun d1628251663 e1628251664 -> Type) -> Type) -> Type) -> Type) (TyFun [a1628251660] (TyFun [b1628251661] (TyFun [c1628251662] (TyFun [d1628251663] [e1628251664] -> Type) -> Type) -> Type) -> Type) -> *) (ZipWith4Sym0 a1628251660 b1628251661 c1628251662 d1628251663 e1628251664) Source # | |
SuppressUnusedWarnings (TyFun [(a1627953342, b1627953343, c1627953344, d1627953345, e1627953346)] ([a1627953342], [b1627953343], [c1627953344], [d1627953345], [e1627953346]) -> *) (Unzip5Sym0 a1627953342 b1627953343 c1627953344 d1627953345 e1627953346) Source # | |
SuppressUnusedWarnings (TyFun [a1628251678] (TyFun [b1628251679] (TyFun [c1628251680] (TyFun [d1628251681] (TyFun [e1628251682] [(a1628251678, b1628251679, c1628251680, d1628251681, e1628251682)] -> Type) -> Type) -> Type) -> Type) -> *) (Zip5Sym0 a1628251678 b1628251679 c1628251680 d1628251681 e1628251682) Source # | |
SuppressUnusedWarnings (TyFun a822083586 (TyFun b822083587 (TyFun c822083588 (TyFun d822083589 (TyFun e822083590 (a822083586, b822083587, c822083588, d822083589, e822083590) -> Type) -> Type) -> Type) -> Type) -> *) (Tuple5Sym0 a822083586 b822083587 c822083588 d822083589 e822083590) Source # | |
SuppressUnusedWarnings ((TyFun a1628251654 (TyFun b1628251655 (TyFun c1628251656 (TyFun d1628251657 (TyFun e1628251658 f1628251659 -> Type) -> Type) -> Type) -> Type) -> Type) -> TyFun [a1628251654] (TyFun [b1628251655] (TyFun [c1628251656] (TyFun [d1628251657] (TyFun [e1628251658] [f1628251659] -> Type) -> Type) -> Type) -> Type) -> *) (ZipWith5Sym1 a1628251654 b1628251655 c1628251656 d1628251657 e1628251658 f1628251659) Source # | |
SuppressUnusedWarnings ((TyFun a1628251654 (TyFun b1628251655 (TyFun c1628251656 (TyFun d1628251657 (TyFun e1628251658 f1628251659 -> Type) -> Type) -> Type) -> Type) -> Type) -> [a1628251654] -> TyFun [b1628251655] (TyFun [c1628251656] (TyFun [d1628251657] (TyFun [e1628251658] [f1628251659] -> Type) -> Type) -> Type) -> *) (ZipWith5Sym2 a1628251654 b1628251655 c1628251656 d1628251657 e1628251658 f1628251659) Source # | |
SuppressUnusedWarnings ((TyFun a1628251654 (TyFun b1628251655 (TyFun c1628251656 (TyFun d1628251657 (TyFun e1628251658 f1628251659 -> Type) -> Type) -> Type) -> Type) -> Type) -> [a1628251654] -> [b1628251655] -> TyFun [c1628251656] (TyFun [d1628251657] (TyFun [e1628251658] [f1628251659] -> Type) -> Type) -> *) (ZipWith5Sym3 a1628251654 b1628251655 c1628251656 d1628251657 e1628251658 f1628251659) Source # | |
SuppressUnusedWarnings ((TyFun a1628251654 (TyFun b1628251655 (TyFun c1628251656 (TyFun d1628251657 (TyFun e1628251658 f1628251659 -> Type) -> Type) -> Type) -> Type) -> Type) -> [a1628251654] -> [b1628251655] -> [c1628251656] -> TyFun [d1628251657] (TyFun [e1628251658] [f1628251659] -> Type) -> *) (ZipWith5Sym4 a1628251654 b1628251655 c1628251656 d1628251657 e1628251658 f1628251659) Source # | |
SuppressUnusedWarnings ((TyFun a1628251654 (TyFun b1628251655 (TyFun c1628251656 (TyFun d1628251657 (TyFun e1628251658 f1628251659 -> Type) -> Type) -> Type) -> Type) -> Type) -> [a1628251654] -> [b1628251655] -> [c1628251656] -> [d1628251657] -> TyFun [e1628251658] [f1628251659] -> *) (ZipWith5Sym5 a1628251654 b1628251655 c1628251656 d1628251657 e1628251658 f1628251659) Source # | |
SuppressUnusedWarnings ([a1628251672] -> TyFun [b1628251673] (TyFun [c1628251674] (TyFun [d1628251675] (TyFun [e1628251676] (TyFun [f1628251677] [(a1628251672, b1628251673, c1628251674, d1628251675, e1628251676, f1628251677)] -> Type) -> Type) -> Type) -> Type) -> *) (Zip6Sym1 b1628251673 c1628251674 d1628251675 e1628251676 f1628251677 a1628251672) Source # | |
SuppressUnusedWarnings ([a1628251672] -> [b1628251673] -> TyFun [c1628251674] (TyFun [d1628251675] (TyFun [e1628251676] (TyFun [f1628251677] [(a1628251672, b1628251673, c1628251674, d1628251675, e1628251676, f1628251677)] -> Type) -> Type) -> Type) -> *) (Zip6Sym2 c1628251674 d1628251675 e1628251676 f1628251677 b1628251673 a1628251672) Source # | |
SuppressUnusedWarnings ([a1628251672] -> [b1628251673] -> [c1628251674] -> TyFun [d1628251675] (TyFun [e1628251676] (TyFun [f1628251677] [(a1628251672, b1628251673, c1628251674, d1628251675, e1628251676, f1628251677)] -> Type) -> Type) -> *) (Zip6Sym3 d1628251675 e1628251676 f1628251677 c1628251674 b1628251673 a1628251672) Source # | |
SuppressUnusedWarnings ([a1628251672] -> [b1628251673] -> [c1628251674] -> [d1628251675] -> TyFun [e1628251676] (TyFun [f1628251677] [(a1628251672, b1628251673, c1628251674, d1628251675, e1628251676, f1628251677)] -> Type) -> *) (Zip6Sym4 e1628251676 f1628251677 d1628251675 c1628251674 b1628251673 a1628251672) Source # | |
SuppressUnusedWarnings ([a1628251672] -> [b1628251673] -> [c1628251674] -> [d1628251675] -> [e1628251676] -> TyFun [f1628251677] [(a1628251672, b1628251673, c1628251674, d1628251675, e1628251676, f1628251677)] -> *) (Zip6Sym5 f1628251677 e1628251676 d1628251675 c1628251674 b1628251673 a1628251672) Source # | |
SuppressUnusedWarnings (a822083586 -> TyFun b822083587 (TyFun c822083588 (TyFun d822083589 (TyFun e822083590 (TyFun f822083591 (a822083586, b822083587, c822083588, d822083589, e822083590, f822083591) -> Type) -> Type) -> Type) -> Type) -> *) (Tuple6Sym1 b822083587 c822083588 d822083589 e822083590 f822083591 a822083586) Source # | |
SuppressUnusedWarnings (a822083586 -> b822083587 -> TyFun c822083588 (TyFun d822083589 (TyFun e822083590 (TyFun f822083591 (a822083586, b822083587, c822083588, d822083589, e822083590, f822083591) -> Type) -> Type) -> Type) -> *) (Tuple6Sym2 c822083588 d822083589 e822083590 f822083591 b822083587 a822083586) Source # | |
SuppressUnusedWarnings (a822083586 -> b822083587 -> c822083588 -> TyFun d822083589 (TyFun e822083590 (TyFun f822083591 (a822083586, b822083587, c822083588, d822083589, e822083590, f822083591) -> Type) -> Type) -> *) (Tuple6Sym3 d822083589 e822083590 f822083591 c822083588 b822083587 a822083586) Source # | |
SuppressUnusedWarnings (a822083586 -> b822083587 -> c822083588 -> d822083589 -> TyFun e822083590 (TyFun f822083591 (a822083586, b822083587, c822083588, d822083589, e822083590, f822083591) -> Type) -> *) (Tuple6Sym4 e822083590 f822083591 d822083589 c822083588 b822083587 a822083586) Source # | |
SuppressUnusedWarnings (a822083586 -> b822083587 -> c822083588 -> d822083589 -> e822083590 -> TyFun f822083591 (a822083586, b822083587, c822083588, d822083589, e822083590, f822083591) -> *) (Tuple6Sym5 f822083591 e822083590 d822083589 c822083588 b822083587 a822083586) Source # | |
SuppressUnusedWarnings (TyFun (TyFun a1628251654 (TyFun b1628251655 (TyFun c1628251656 (TyFun d1628251657 (TyFun e1628251658 f1628251659 -> Type) -> Type) -> Type) -> Type) -> Type) (TyFun [a1628251654] (TyFun [b1628251655] (TyFun [c1628251656] (TyFun [d1628251657] (TyFun [e1628251658] [f1628251659] -> Type) -> Type) -> Type) -> Type) -> Type) -> *) (ZipWith5Sym0 a1628251654 b1628251655 c1628251656 d1628251657 e1628251658 f1628251659) Source # | |
SuppressUnusedWarnings (TyFun [(a1627953336, b1627953337, c1627953338, d1627953339, e1627953340, f1627953341)] ([a1627953336], [b1627953337], [c1627953338], [d1627953339], [e1627953340], [f1627953341]) -> *) (Unzip6Sym0 a1627953336 b1627953337 c1627953338 d1627953339 e1627953340 f1627953341) Source # | |
SuppressUnusedWarnings (TyFun [a1628251672] (TyFun [b1628251673] (TyFun [c1628251674] (TyFun [d1628251675] (TyFun [e1628251676] (TyFun [f1628251677] [(a1628251672, b1628251673, c1628251674, d1628251675, e1628251676, f1628251677)] -> Type) -> Type) -> Type) -> Type) -> Type) -> *) (Zip6Sym0 a1628251672 b1628251673 c1628251674 d1628251675 e1628251676 f1628251677) Source # | |
SuppressUnusedWarnings (TyFun a822083586 (TyFun b822083587 (TyFun c822083588 (TyFun d822083589 (TyFun e822083590 (TyFun f822083591 (a822083586, b822083587, c822083588, d822083589, e822083590, f822083591) -> Type) -> Type) -> Type) -> Type) -> Type) -> *) (Tuple6Sym0 a822083586 b822083587 c822083588 d822083589 e822083590 f822083591) Source # | |
SuppressUnusedWarnings ((TyFun a1628251647 (TyFun b1628251648 (TyFun c1628251649 (TyFun d1628251650 (TyFun e1628251651 (TyFun f1628251652 g1628251653 -> Type) -> Type) -> Type) -> Type) -> Type) -> Type) -> TyFun [a1628251647] (TyFun [b1628251648] (TyFun [c1628251649] (TyFun [d1628251650] (TyFun [e1628251651] (TyFun [f1628251652] [g1628251653] -> Type) -> Type) -> Type) -> Type) -> Type) -> *) (ZipWith6Sym1 a1628251647 b1628251648 c1628251649 d1628251650 e1628251651 f1628251652 g1628251653) Source # | |
SuppressUnusedWarnings ((TyFun a1628251647 (TyFun b1628251648 (TyFun c1628251649 (TyFun d1628251650 (TyFun e1628251651 (TyFun f1628251652 g1628251653 -> Type) -> Type) -> Type) -> Type) -> Type) -> Type) -> [a1628251647] -> TyFun [b1628251648] (TyFun [c1628251649] (TyFun [d1628251650] (TyFun [e1628251651] (TyFun [f1628251652] [g1628251653] -> Type) -> Type) -> Type) -> Type) -> *) (ZipWith6Sym2 a1628251647 b1628251648 c1628251649 d1628251650 e1628251651 f1628251652 g1628251653) Source # | |
SuppressUnusedWarnings ((TyFun a1628251647 (TyFun b1628251648 (TyFun c1628251649 (TyFun d1628251650 (TyFun e1628251651 (TyFun f1628251652 g1628251653 -> Type) -> Type) -> Type) -> Type) -> Type) -> Type) -> [a1628251647] -> [b1628251648] -> TyFun [c1628251649] (TyFun [d1628251650] (TyFun [e1628251651] (TyFun [f1628251652] [g1628251653] -> Type) -> Type) -> Type) -> *) (ZipWith6Sym3 a1628251647 b1628251648 c1628251649 d1628251650 e1628251651 f1628251652 g1628251653) Source # | |
SuppressUnusedWarnings ((TyFun a1628251647 (TyFun b1628251648 (TyFun c1628251649 (TyFun d1628251650 (TyFun e1628251651 (TyFun f1628251652 g1628251653 -> Type) -> Type) -> Type) -> Type) -> Type) -> Type) -> [a1628251647] -> [b1628251648] -> [c1628251649] -> TyFun [d1628251650] (TyFun [e1628251651] (TyFun [f1628251652] [g1628251653] -> Type) -> Type) -> *) (ZipWith6Sym4 a1628251647 b1628251648 c1628251649 d1628251650 e1628251651 f1628251652 g1628251653) Source # | |
SuppressUnusedWarnings ((TyFun a1628251647 (TyFun b1628251648 (TyFun c1628251649 (TyFun d1628251650 (TyFun e1628251651 (TyFun f1628251652 g1628251653 -> Type) -> Type) -> Type) -> Type) -> Type) -> Type) -> [a1628251647] -> [b1628251648] -> [c1628251649] -> [d1628251650] -> TyFun [e1628251651] (TyFun [f1628251652] [g1628251653] -> Type) -> *) (ZipWith6Sym5 a1628251647 b1628251648 c1628251649 d1628251650 e1628251651 f1628251652 g1628251653) Source # | |
SuppressUnusedWarnings ((TyFun a1628251647 (TyFun b1628251648 (TyFun c1628251649 (TyFun d1628251650 (TyFun e1628251651 (TyFun f1628251652 g1628251653 -> Type) -> Type) -> Type) -> Type) -> Type) -> Type) -> [a1628251647] -> [b1628251648] -> [c1628251649] -> [d1628251650] -> [e1628251651] -> TyFun [f1628251652] [g1628251653] -> *) (ZipWith6Sym6 a1628251647 b1628251648 c1628251649 d1628251650 e1628251651 f1628251652 g1628251653) Source # | |
SuppressUnusedWarnings ([a1628251665] -> TyFun [b1628251666] (TyFun [c1628251667] (TyFun [d1628251668] (TyFun [e1628251669] (TyFun [f1628251670] (TyFun [g1628251671] [(a1628251665, b1628251666, c1628251667, d1628251668, e1628251669, f1628251670, g1628251671)] -> Type) -> Type) -> Type) -> Type) -> Type) -> *) (Zip7Sym1 b1628251666 c1628251667 d1628251668 e1628251669 f1628251670 g1628251671 a1628251665) Source # | |
SuppressUnusedWarnings ([a1628251665] -> [b1628251666] -> TyFun [c1628251667] (TyFun [d1628251668] (TyFun [e1628251669] (TyFun [f1628251670] (TyFun [g1628251671] [(a1628251665, b1628251666, c1628251667, d1628251668, e1628251669, f1628251670, g1628251671)] -> Type) -> Type) -> Type) -> Type) -> *) (Zip7Sym2 c1628251667 d1628251668 e1628251669 f1628251670 g1628251671 b1628251666 a1628251665) Source # | |
SuppressUnusedWarnings ([a1628251665] -> [b1628251666] -> [c1628251667] -> TyFun [d1628251668] (TyFun [e1628251669] (TyFun [f1628251670] (TyFun [g1628251671] [(a1628251665, b1628251666, c1628251667, d1628251668, e1628251669, f1628251670, g1628251671)] -> Type) -> Type) -> Type) -> *) (Zip7Sym3 d1628251668 e1628251669 f1628251670 g1628251671 c1628251667 b1628251666 a1628251665) Source # | |
SuppressUnusedWarnings ([a1628251665] -> [b1628251666] -> [c1628251667] -> [d1628251668] -> TyFun [e1628251669] (TyFun [f1628251670] (TyFun [g1628251671] [(a1628251665, b1628251666, c1628251667, d1628251668, e1628251669, f1628251670, g1628251671)] -> Type) -> Type) -> *) (Zip7Sym4 e1628251669 f1628251670 g1628251671 d1628251668 c1628251667 b1628251666 a1628251665) Source # | |
SuppressUnusedWarnings ([a1628251665] -> [b1628251666] -> [c1628251667] -> [d1628251668] -> [e1628251669] -> TyFun [f1628251670] (TyFun [g1628251671] [(a1628251665, b1628251666, c1628251667, d1628251668, e1628251669, f1628251670, g1628251671)] -> Type) -> *) (Zip7Sym5 f1628251670 g1628251671 e1628251669 d1628251668 c1628251667 b1628251666 a1628251665) Source # | |
SuppressUnusedWarnings ([a1628251665] -> [b1628251666] -> [c1628251667] -> [d1628251668] -> [e1628251669] -> [f1628251670] -> TyFun [g1628251671] [(a1628251665, b1628251666, c1628251667, d1628251668, e1628251669, f1628251670, g1628251671)] -> *) (Zip7Sym6 g1628251671 f1628251670 e1628251669 d1628251668 c1628251667 b1628251666 a1628251665) Source # | |
SuppressUnusedWarnings (a822083586 -> TyFun b822083587 (TyFun c822083588 (TyFun d822083589 (TyFun e822083590 (TyFun f822083591 (TyFun g822083592 (a822083586, b822083587, c822083588, d822083589, e822083590, f822083591, g822083592) -> Type) -> Type) -> Type) -> Type) -> Type) -> *) (Tuple7Sym1 b822083587 c822083588 d822083589 e822083590 f822083591 g822083592 a822083586) Source # | |
SuppressUnusedWarnings (a822083586 -> b822083587 -> TyFun c822083588 (TyFun d822083589 (TyFun e822083590 (TyFun f822083591 (TyFun g822083592 (a822083586, b822083587, c822083588, d822083589, e822083590, f822083591, g822083592) -> Type) -> Type) -> Type) -> Type) -> *) (Tuple7Sym2 c822083588 d822083589 e822083590 f822083591 g822083592 b822083587 a822083586) Source # | |
SuppressUnusedWarnings (a822083586 -> b822083587 -> c822083588 -> TyFun d822083589 (TyFun e822083590 (TyFun f822083591 (TyFun g822083592 (a822083586, b822083587, c822083588, d822083589, e822083590, f822083591, g822083592) -> Type) -> Type) -> Type) -> *) (Tuple7Sym3 d822083589 e822083590 f822083591 g822083592 c822083588 b822083587 a822083586) Source # | |
SuppressUnusedWarnings (a822083586 -> b822083587 -> c822083588 -> d822083589 -> TyFun e822083590 (TyFun f822083591 (TyFun g822083592 (a822083586, b822083587, c822083588, d822083589, e822083590, f822083591, g822083592) -> Type) -> Type) -> *) (Tuple7Sym4 e822083590 f822083591 g822083592 d822083589 c822083588 b822083587 a822083586) Source # | |
SuppressUnusedWarnings (a822083586 -> b822083587 -> c822083588 -> d822083589 -> e822083590 -> TyFun f822083591 (TyFun g822083592 (a822083586, b822083587, c822083588, d822083589, e822083590, f822083591, g822083592) -> Type) -> *) (Tuple7Sym5 f822083591 g822083592 e822083590 d822083589 c822083588 b822083587 a822083586) Source # | |
SuppressUnusedWarnings (a822083586 -> b822083587 -> c822083588 -> d822083589 -> e822083590 -> f822083591 -> TyFun g822083592 (a822083586, b822083587, c822083588, d822083589, e822083590, f822083591, g822083592) -> *) (Tuple7Sym6 g822083592 f822083591 e822083590 d822083589 c822083588 b822083587 a822083586) Source # | |
SuppressUnusedWarnings (TyFun (TyFun a1628251647 (TyFun b1628251648 (TyFun c1628251649 (TyFun d1628251650 (TyFun e1628251651 (TyFun f1628251652 g1628251653 -> Type) -> Type) -> Type) -> Type) -> Type) -> Type) (TyFun [a1628251647] (TyFun [b1628251648] (TyFun [c1628251649] (TyFun [d1628251650] (TyFun [e1628251651] (TyFun [f1628251652] [g1628251653] -> Type) -> Type) -> Type) -> Type) -> Type) -> Type) -> *) (ZipWith6Sym0 a1628251647 b1628251648 c1628251649 d1628251650 e1628251651 f1628251652 g1628251653) Source # | |
SuppressUnusedWarnings (TyFun [(a1627953329, b1627953330, c1627953331, d1627953332, e1627953333, f1627953334, g1627953335)] ([a1627953329], [b1627953330], [c1627953331], [d1627953332], [e1627953333], [f1627953334], [g1627953335]) -> *) (Unzip7Sym0 a1627953329 b1627953330 c1627953331 d1627953332 e1627953333 f1627953334 g1627953335) Source # | |
SuppressUnusedWarnings (TyFun [a1628251665] (TyFun [b1628251666] (TyFun [c1628251667] (TyFun [d1628251668] (TyFun [e1628251669] (TyFun [f1628251670] (TyFun [g1628251671] [(a1628251665, b1628251666, c1628251667, d1628251668, e1628251669, f1628251670, g1628251671)] -> Type) -> Type) -> Type) -> Type) -> Type) -> Type) -> *) (Zip7Sym0 a1628251665 b1628251666 c1628251667 d1628251668 e1628251669 f1628251670 g1628251671) Source # | |
SuppressUnusedWarnings (TyFun a822083586 (TyFun b822083587 (TyFun c822083588 (TyFun d822083589 (TyFun e822083590 (TyFun f822083591 (TyFun g822083592 (a822083586, b822083587, c822083588, d822083589, e822083590, f822083591, g822083592) -> Type) -> Type) -> Type) -> Type) -> Type) -> Type) -> *) (Tuple7Sym0 a822083586 b822083587 c822083588 d822083589 e822083590 f822083591 g822083592) Source # | |
SuppressUnusedWarnings ((TyFun a1628251639 (TyFun b1628251640 (TyFun c1628251641 (TyFun d1628251642 (TyFun e1628251643 (TyFun f1628251644 (TyFun g1628251645 h1628251646 -> Type) -> Type) -> Type) -> Type) -> Type) -> Type) -> Type) -> TyFun [a1628251639] (TyFun [b1628251640] (TyFun [c1628251641] (TyFun [d1628251642] (TyFun [e1628251643] (TyFun [f1628251644] (TyFun [g1628251645] [h1628251646] -> Type) -> Type) -> Type) -> Type) -> Type) -> Type) -> *) (ZipWith7Sym1 a1628251639 b1628251640 c1628251641 d1628251642 e1628251643 f1628251644 g1628251645 h1628251646) Source # | |
SuppressUnusedWarnings ((TyFun a1628251639 (TyFun b1628251640 (TyFun c1628251641 (TyFun d1628251642 (TyFun e1628251643 (TyFun f1628251644 (TyFun g1628251645 h1628251646 -> Type) -> Type) -> Type) -> Type) -> Type) -> Type) -> Type) -> [a1628251639] -> TyFun [b1628251640] (TyFun [c1628251641] (TyFun [d1628251642] (TyFun [e1628251643] (TyFun [f1628251644] (TyFun [g1628251645] [h1628251646] -> Type) -> Type) -> Type) -> Type) -> Type) -> *) (ZipWith7Sym2 a1628251639 b1628251640 c1628251641 d1628251642 e1628251643 f1628251644 g1628251645 h1628251646) Source # | |
SuppressUnusedWarnings ((TyFun a1628251639 (TyFun b1628251640 (TyFun c1628251641 (TyFun d1628251642 (TyFun e1628251643 (TyFun f1628251644 (TyFun g1628251645 h1628251646 -> Type) -> Type) -> Type) -> Type) -> Type) -> Type) -> Type) -> [a1628251639] -> [b1628251640] -> TyFun [c1628251641] (TyFun [d1628251642] (TyFun [e1628251643] (TyFun [f1628251644] (TyFun [g1628251645] [h1628251646] -> Type) -> Type) -> Type) -> Type) -> *) (ZipWith7Sym3 a1628251639 b1628251640 c1628251641 d1628251642 e1628251643 f1628251644 g1628251645 h1628251646) Source # | |
SuppressUnusedWarnings ((TyFun a1628251639 (TyFun b1628251640 (TyFun c1628251641 (TyFun d1628251642 (TyFun e1628251643 (TyFun f1628251644 (TyFun g1628251645 h1628251646 -> Type) -> Type) -> Type) -> Type) -> Type) -> Type) -> Type) -> [a1628251639] -> [b1628251640] -> [c1628251641] -> TyFun [d1628251642] (TyFun [e1628251643] (TyFun [f1628251644] (TyFun [g1628251645] [h1628251646] -> Type) -> Type) -> Type) -> *) (ZipWith7Sym4 a1628251639 b1628251640 c1628251641 d1628251642 e1628251643 f1628251644 g1628251645 h1628251646) Source # | |
SuppressUnusedWarnings ((TyFun a1628251639 (TyFun b1628251640 (TyFun c1628251641 (TyFun d1628251642 (TyFun e1628251643 (TyFun f1628251644 (TyFun g1628251645 h1628251646 -> Type) -> Type) -> Type) -> Type) -> Type) -> Type) -> Type) -> [a1628251639] -> [b1628251640] -> [c1628251641] -> [d1628251642] -> TyFun [e1628251643] (TyFun [f1628251644] (TyFun [g1628251645] [h1628251646] -> Type) -> Type) -> *) (ZipWith7Sym5 a1628251639 b1628251640 c1628251641 d1628251642 e1628251643 f1628251644 g1628251645 h1628251646) Source # | |
SuppressUnusedWarnings ((TyFun a1628251639 (TyFun b1628251640 (TyFun c1628251641 (TyFun d1628251642 (TyFun e1628251643 (TyFun f1628251644 (TyFun g1628251645 h1628251646 -> Type) -> Type) -> Type) -> Type) -> Type) -> Type) -> Type) -> [a1628251639] -> [b1628251640] -> [c1628251641] -> [d1628251642] -> [e1628251643] -> TyFun [f1628251644] (TyFun [g1628251645] [h1628251646] -> Type) -> *) (ZipWith7Sym6 a1628251639 b1628251640 c1628251641 d1628251642 e1628251643 f1628251644 g1628251645 h1628251646) Source # | |
SuppressUnusedWarnings ((TyFun a1628251639 (TyFun b1628251640 (TyFun c1628251641 (TyFun d1628251642 (TyFun e1628251643 (TyFun f1628251644 (TyFun g1628251645 h1628251646 -> Type) -> Type) -> Type) -> Type) -> Type) -> Type) -> Type) -> [a1628251639] -> [b1628251640] -> [c1628251641] -> [d1628251642] -> [e1628251643] -> [f1628251644] -> TyFun [g1628251645] [h1628251646] -> *) (ZipWith7Sym7 a1628251639 b1628251640 c1628251641 d1628251642 e1628251643 f1628251644 g1628251645 h1628251646) Source # | |
SuppressUnusedWarnings (TyFun (TyFun a1628251639 (TyFun b1628251640 (TyFun c1628251641 (TyFun d1628251642 (TyFun e1628251643 (TyFun f1628251644 (TyFun g1628251645 h1628251646 -> Type) -> Type) -> Type) -> Type) -> Type) -> Type) -> Type) (TyFun [a1628251639] (TyFun [b1628251640] (TyFun [c1628251641] (TyFun [d1628251642] (TyFun [e1628251643] (TyFun [f1628251644] (TyFun [g1628251645] [h1628251646] -> Type) -> Type) -> Type) -> Type) -> Type) -> Type) -> Type) -> *) (ZipWith7Sym0 a1628251639 b1628251640 c1628251641 d1628251642 e1628251643 f1628251644 g1628251645 h1628251646) Source # | |
type Apply Bool (TyFun Bool Bool -> Type) (:&&$) l0 Source # | |
type Apply Bool (TyFun Bool Bool -> Type) (:||$) l0 Source # | |
type Apply Ordering (TyFun Ordering Ordering -> Type) ThenCmpSym0 l0 Source # | |
type Apply Nat (TyFun Nat Nat -> *) (:^$) l0 Source # | |
type Apply Nat (TyFun [a1627953305] ([a1627953305], [a1627953305]) -> Type) (SplitAtSym0 a1627953305) l0 Source # | |
type Apply Nat (TyFun [a1627953307] [a1627953307] -> Type) (TakeSym0 a1627953307) l0 Source # | |
type Apply Nat (TyFun [a1627953306] [a1627953306] -> Type) (DropSym0 a1627953306) l0 Source # | |
type Apply Nat (TyFun a1627953291 [a1627953291] -> Type) (ReplicateSym0 a1627953291) l0 Source # | |
type Apply a822083586 (TyFun [a822083586] [a822083586] -> Type) ((:$) a822083586) l0 Source # | |
type Apply a1627657621 (TyFun a1627657621 (TyFun Bool a1627657621 -> Type) -> Type) (Bool_Sym0 a1627657621) l0 Source # | |
type Apply a1627662065 (TyFun a1627662065 Bool -> Type) ((:/=$) a1627662065) l0 Source # | |
type Apply a1627662065 (TyFun a1627662065 Bool -> Type) ((:==$) a1627662065) l0 Source # | |
type Apply a1627682221 (TyFun a1627682221 a1627682221 -> Type) (MinSym0 a1627682221) l0 Source # | |
type Apply a1627682221 (TyFun a1627682221 a1627682221 -> Type) (MaxSym0 a1627682221) l0 Source # | |
type Apply a1627682221 (TyFun a1627682221 Bool -> Type) ((:>=$) a1627682221) l0 Source # | |
type Apply a1627682221 (TyFun a1627682221 Bool -> Type) ((:>$) a1627682221) l0 Source # | |
type Apply a1627682221 (TyFun a1627682221 Bool -> Type) ((:<=$) a1627682221) l0 Source # | |
type Apply a1627682221 (TyFun a1627682221 Bool -> Type) ((:<$) a1627682221) l0 Source # | |
type Apply a1627682221 (TyFun a1627682221 Ordering -> Type) (CompareSym0 a1627682221) l0 Source # | |
type Apply a1627796644 (TyFun a1627796644 a1627796644 -> Type) (AsTypeOfSym0 a1627796644) l0 Source # | |
type Apply a1627817219 (TyFun a1627817219 a1627817219 -> Type) ((:*$) a1627817219) l0 Source # | |
type Apply a1627817219 (TyFun a1627817219 a1627817219 -> Type) ((:-$) a1627817219) l0 Source # | |
type Apply a1627817219 (TyFun a1627817219 a1627817219 -> Type) ((:+$) a1627817219) l0 Source # | |
type Apply a1627819601 (TyFun a1627819601 a1627819601 -> Type) (SubtractSym0 a1627819601) l0 Source # | |
type Apply a1627849033 (TyFun (Maybe a1627849033) a1627849033 -> Type) (FromMaybeSym0 a1627849033) l0 Source # | |
type Apply a1627864213 (TyFun a1627864213 (TyFun a1627864213 [a1627864213] -> Type) -> Type) (EnumFromThenToSym0 a1627864213) l0 Source # | |
type Apply a1627864213 (TyFun a1627864213 [a1627864213] -> Type) (EnumFromToSym0 a1627864213) l0 Source # | |
type Apply a1627953403 (TyFun [a1627953403] [a1627953403] -> Type) (IntersperseSym0 a1627953403) l0 Source # | |
type Apply a1627953369 (TyFun [a1627953369] Bool -> Type) (ElemSym0 a1627953369) l0 Source # | |
type Apply a1627953368 (TyFun [a1627953368] Bool -> Type) (NotElemSym0 a1627953368) l0 Source # | |
type Apply a1627953318 (TyFun [a1627953318] (Maybe Nat) -> Type) (ElemIndexSym0 a1627953318) l0 Source # | |
type Apply a1627953317 (TyFun [a1627953317] [Nat] -> Type) (ElemIndicesSym0 a1627953317) l0 Source # | |
type Apply a1627953328 (TyFun [a1627953328] [a1627953328] -> Type) (DeleteSym0 a1627953328) l0 Source # | |
type Apply a1627953301 (TyFun [a1627953301] [a1627953301] -> Type) (InsertSym0 a1627953301) l0 Source # | |
type Apply a822083586 (TyFun b822083587 (a822083586, b822083587) -> Type) (Tuple2Sym0 a822083586 b822083587) l0 Source # | |
type Apply a1627657621 (TyFun Bool a1627657621 -> Type) (Bool_Sym1 a1627657621 l1) l0 Source # | |
type Apply a1627796651 (TyFun b1627796652 a1627796651 -> Type) (ConstSym0 b1627796652 a1627796651) l0 Source # | |
type Apply a1627796642 (TyFun b1627796643 b1627796643 -> Type) (SeqSym0 a1627796642 b1627796643) l0 Source # | |
type Apply b1627847771 (TyFun (TyFun a1627847772 b1627847771 -> Type) (TyFun (Maybe a1627847772) b1627847771 -> Type) -> Type) (Maybe_Sym0 a1627847772 b1627847771) l0 Source # | |
type Apply a1627864213 (TyFun a1627864213 [a1627864213] -> Type) (EnumFromThenToSym1 a1627864213 l1) l0 Source # | |
type Apply a1627953326 (TyFun [a1627953326] [a1627953326] -> Type) (DeleteBySym1 a1627953326 l1) l0 Source # | |
type Apply a1627953323 (TyFun [a1627953323] [a1627953323] -> Type) (InsertBySym1 a1627953323 l1) l0 Source # | |
type Apply a1627953297 (TyFun [(a1627953297, b1627953298)] (Maybe b1627953298) -> Type) (LookupSym0 a1627953297 b1627953298) l0 Source # | |
type Apply i1628251637 (TyFun [a1628251638] [a1628251638] -> Type) (GenericTakeSym0 i1628251637 a1628251638) l0 Source # | |
type Apply i1628251635 (TyFun [a1628251636] [a1628251636] -> Type) (GenericDropSym0 i1628251635 a1628251636) l0 Source # | |
type Apply i1628251633 (TyFun [a1628251634] ([a1628251634], [a1628251634]) -> Type) (GenericSplitAtSym0 i1628251633 a1628251634) l0 Source # | |
type Apply i1628251629 (TyFun a1628251630 [a1628251630] -> Type) (GenericReplicateSym0 i1628251629 a1628251630) l0 Source # | |
type Apply a822083586 (TyFun b822083587 (TyFun c822083588 (a822083586, b822083587, c822083588) -> Type) -> Type) (Tuple3Sym0 a822083586 b822083587 c822083588) l0 Source # | |
type Apply b1627619913 (TyFun [a1627619912] b1627619913 -> Type) (FoldlSym1 a1627619912 b1627619913 l1) l0 Source # | |
type Apply b1627796658 (TyFun [a1627796657] b1627796658 -> Type) (FoldrSym1 a1627796657 b1627796658 l1) l0 Source # | |
type Apply b1627953397 (TyFun [a1627953396] b1627953397 -> Type) (Foldl'Sym1 a1627953396 b1627953397 l1) l0 Source # | |
type Apply b1627953387 (TyFun [a1627953388] [b1627953387] -> Type) (ScanlSym1 a1627953388 b1627953387 l1) l0 Source # | |
type Apply b1627953385 (TyFun [a1627953384] [b1627953385] -> Type) (ScanrSym1 a1627953384 b1627953385 l1) l0 Source # | |
type Apply k1 ((~>) k2 k3) (TyCon2 k1 k2 k3 f) x Source # | |
type Apply a822083586 (TyFun b822083587 (TyFun c822083588 (TyFun d822083589 (a822083586, b822083587, c822083588, d822083589) -> Type) -> Type) -> Type) (Tuple4Sym0 a822083586 b822083587 c822083588 d822083589) l0 Source # | |
type Apply b822083587 (TyFun c822083588 (a822083586, b822083587, c822083588) -> Type) (Tuple3Sym1 b822083587 c822083588 a822083586 l1) l0 Source # | |
type Apply b1627796646 (TyFun a1627796645 c1627796647 -> Type) (FlipSym1 a1627796645 b1627796646 c1627796647 l1) l0 Source # | |
type Apply a1627840724 (TyFun b1627840725 c1627840726 -> Type) (CurrySym1 a1627840724 b1627840725 c1627840726 l1) l0 Source # | |
type Apply acc1627953380 (TyFun [x1627953381] (acc1627953380, [y1627953382]) -> Type) (MapAccumLSym1 x1627953381 acc1627953380 y1627953382 l1) l0 Source # | |
type Apply acc1627953377 (TyFun [x1627953378] (acc1627953377, [y1627953379]) -> Type) (MapAccumRSym1 x1627953378 acc1627953377 y1627953379 l1) l0 Source # | |
type Apply k1 ((~>) k2 ((~>) k3 k4)) (TyCon3 k1 k2 k3 k4 f) x Source # | |
type Apply a822083586 (TyFun b822083587 (TyFun c822083588 (TyFun d822083589 (TyFun e822083590 (a822083586, b822083587, c822083588, d822083589, e822083590) -> Type) -> Type) -> Type) -> Type) (Tuple5Sym0 a822083586 b822083587 c822083588 d822083589 e822083590) l0 Source # | |
type Apply b822083587 (TyFun c822083588 (TyFun d822083589 (a822083586, b822083587, c822083588, d822083589) -> Type) -> Type) (Tuple4Sym1 b822083587 c822083588 d822083589 a822083586 l1) l0 Source # | |
type Apply k1 ((~>) k2 ((~>) k3 ((~>) k4 k5))) (TyCon4 k1 k2 k3 k4 k5 f) x Source # | |
type Apply a822083586 (TyFun b822083587 (TyFun c822083588 (TyFun d822083589 (TyFun e822083590 (TyFun f822083591 (a822083586, b822083587, c822083588, d822083589, e822083590, f822083591) -> Type) -> Type) -> Type) -> Type) -> Type) (Tuple6Sym0 a822083586 b822083587 c822083588 d822083589 e822083590 f822083591) l0 Source # | |
type Apply b822083587 (TyFun c822083588 (TyFun d822083589 (TyFun e822083590 (a822083586, b822083587, c822083588, d822083589, e822083590) -> Type) -> Type) -> Type) (Tuple5Sym1 b822083587 c822083588 d822083589 e822083590 a822083586 l1) l0 Source # | |
type Apply c822083588 (TyFun d822083589 (a822083586, b822083587, c822083588, d822083589) -> Type) (Tuple4Sym2 c822083588 d822083589 b822083587 a822083586 l1 l2) l0 Source # | |
type Apply k1 ((~>) k2 ((~>) k3 ((~>) k4 ((~>) k5 k6)))) (TyCon5 k1 k2 k3 k4 k5 k6 f) x Source # | |
type Apply a822083586 (TyFun b822083587 (TyFun c822083588 (TyFun d822083589 (TyFun e822083590 (TyFun f822083591 (TyFun g822083592 (a822083586, b822083587, c822083588, d822083589, e822083590, f822083591, g822083592) -> Type) -> Type) -> Type) -> Type) -> Type) -> Type) (Tuple7Sym0 a822083586 b822083587 c822083588 d822083589 e822083590 f822083591 g822083592) l0 Source # | |
type Apply b822083587 (TyFun c822083588 (TyFun d822083589 (TyFun e822083590 (TyFun f822083591 (a822083586, b822083587, c822083588, d822083589, e822083590, f822083591) -> Type) -> Type) -> Type) -> Type) (Tuple6Sym1 b822083587 c822083588 d822083589 e822083590 f822083591 a822083586 l1) l0 Source # | |
type Apply c822083588 (TyFun d822083589 (TyFun e822083590 (a822083586, b822083587, c822083588, d822083589, e822083590) -> Type) -> Type) (Tuple5Sym2 c822083588 d822083589 e822083590 b822083587 a822083586 l1 l2) l0 Source # | |
type Apply k1 ((~>) k2 ((~>) k3 ((~>) k4 ((~>) k5 ((~>) k6 k7))))) (TyCon6 k1 k2 k3 k4 k5 k6 k7 f) x Source # | |
type Apply b822083587 (TyFun c822083588 (TyFun d822083589 (TyFun e822083590 (TyFun f822083591 (TyFun g822083592 (a822083586, b822083587, c822083588, d822083589, e822083590, f822083591, g822083592) -> Type) -> Type) -> Type) -> Type) -> Type) (Tuple7Sym1 b822083587 c822083588 d822083589 e822083590 f822083591 g822083592 a822083586 l1) l0 Source # | |
type Apply c822083588 (TyFun d822083589 (TyFun e822083590 (TyFun f822083591 (a822083586, b822083587, c822083588, d822083589, e822083590, f822083591) -> Type) -> Type) -> Type) (Tuple6Sym2 c822083588 d822083589 e822083590 f822083591 b822083587 a822083586 l1 l2) l0 Source # | |
type Apply d822083589 (TyFun e822083590 (a822083586, b822083587, c822083588, d822083589, e822083590) -> Type) (Tuple5Sym3 d822083589 e822083590 c822083588 b822083587 a822083586 l1 l2 l3) l0 Source # | |
type Apply k1 ((~>) k2 ((~>) k3 ((~>) k4 ((~>) k5 ((~>) k6 ((~>) k7 k8)))))) (TyCon7 k1 k2 k3 k4 k5 k6 k7 k8 f) x Source # | |
type Apply c822083588 (TyFun d822083589 (TyFun e822083590 (TyFun f822083591 (TyFun g822083592 (a822083586, b822083587, c822083588, d822083589, e822083590, f822083591, g822083592) -> Type) -> Type) -> Type) -> Type) (Tuple7Sym2 c822083588 d822083589 e822083590 f822083591 g822083592 b822083587 a822083586 l1 l2) l0 Source # | |
type Apply d822083589 (TyFun e822083590 (TyFun f822083591 (a822083586, b822083587, c822083588, d822083589, e822083590, f822083591) -> Type) -> Type) (Tuple6Sym3 d822083589 e822083590 f822083591 c822083588 b822083587 a822083586 l1 l2 l3) l0 Source # | |
type Apply k1 ((~>) k2 ((~>) k3 ((~>) k4 ((~>) k5 ((~>) k6 ((~>) k7 ((~>) k8 k9))))))) (TyCon8 k1 k2 k3 k4 k5 k6 k7 k8 k9 f) x Source # | |
type Apply d822083589 (TyFun e822083590 (TyFun f822083591 (TyFun g822083592 (a822083586, b822083587, c822083588, d822083589, e822083590, f822083591, g822083592) -> Type) -> Type) -> Type) (Tuple7Sym3 d822083589 e822083590 f822083591 g822083592 c822083588 b822083587 a822083586 l1 l2 l3) l0 Source # | |
type Apply e822083590 (TyFun f822083591 (a822083586, b822083587, c822083588, d822083589, e822083590, f822083591) -> Type) (Tuple6Sym4 e822083590 f822083591 d822083589 c822083588 b822083587 a822083586 l1 l2 l3 l4) l0 Source # | |
type Apply e822083590 (TyFun f822083591 (TyFun g822083592 (a822083586, b822083587, c822083588, d822083589, e822083590, f822083591, g822083592) -> Type) -> Type) (Tuple7Sym4 e822083590 f822083591 g822083592 d822083589 c822083588 b822083587 a822083586 l1 l2 l3 l4) l0 Source # | |
type Apply f822083591 (TyFun g822083592 (a822083586, b822083587, c822083588, d822083589, e822083590, f822083591, g822083592) -> Type) (Tuple7Sym5 f822083591 g822083592 e822083590 d822083589 c822083588 b822083587 a822083586 l1 l2 l3 l4 l5) l0 Source # | |
type Apply [a1627796654] (TyFun [a1627796654] [a1627796654] -> Type) ((:++$) a1627796654) l0 Source # | |
type Apply [a1627953371] (TyFun [a1627953371] Bool -> Type) (IsSuffixOfSym0 a1627953371) l0 Source # | |
type Apply [a1627953402] (TyFun [[a1627953402]] [a1627953402] -> Type) (IntercalateSym0 a1627953402) l0 Source # | |
type Apply [a1627953370] (TyFun [a1627953370] Bool -> Type) (IsInfixOfSym0 a1627953370) l0 Source # | |
type Apply [a1627953372] (TyFun [a1627953372] Bool -> Type) (IsPrefixOfSym0 a1627953372) l0 Source # | |
type Apply [a1627953327] (TyFun [a1627953327] [a1627953327] -> Type) ((:\\$) a1627953327) l0 Source # | |
type Apply [a1627953284] (TyFun [a1627953284] [a1627953284] -> Type) (UnionSym0 a1627953284) l0 Source # | |
type Apply [a1627953314] (TyFun [a1627953314] [a1627953314] -> Type) (IntersectSym0 a1627953314) l0 Source # | |
type Apply [a1627953289] (TyFun Nat a1627953289 -> Type) ((:!!$) a1627953289) l0 Source # | |
type Apply [a1628251687] (TyFun [a1628251687] (Maybe [a1628251687]) -> Type) (StripPrefixSym0 a1628251687) l0 Source # | |
type Apply [a1627953366] (TyFun [b1627953367] [(a1627953366, b1627953367)] -> Type) (ZipSym0 a1627953366 b1627953367) l0 Source # | |
type Apply [a1627953285] (TyFun [a1627953285] [a1627953285] -> Type) (UnionBySym1 a1627953285 l1) l0 Source # | |
type Apply [a1627953325] (TyFun [a1627953325] [a1627953325] -> Type) (DeleteFirstsBySym1 a1627953325 l1) l0 Source # | |
type Apply [a1627953313] (TyFun [a1627953313] [a1627953313] -> Type) (IntersectBySym1 a1627953313 l1) l0 Source # | |
type Apply [a1628251632] (TyFun i1628251631 a1628251632 -> Type) (GenericIndexSym0 i1628251631 a1628251632) l0 Source # | |
type Apply [a1627953363] (TyFun [b1627953364] (TyFun [c1627953365] [(a1627953363, b1627953364, c1627953365)] -> Type) -> Type) (Zip3Sym0 a1627953363 b1627953364 c1627953365) l0 Source # | |
type Apply [b1627953364] (TyFun [c1627953365] [(a1627953363, b1627953364, c1627953365)] -> Type) (Zip3Sym1 b1627953364 c1627953365 a1627953363 l1) l0 Source # | |
type Apply [a1627953360] (TyFun [b1627953361] [c1627953362] -> Type) (ZipWithSym1 a1627953360 b1627953361 c1627953362 l1) l0 Source # | |
type Apply [a1628251683] (TyFun [b1628251684] (TyFun [c1628251685] (TyFun [d1628251686] [(a1628251683, b1628251684, c1628251685, d1628251686)] -> Type) -> Type) -> Type) (Zip4Sym0 a1628251683 b1628251684 c1628251685 d1628251686) l0 Source # | |
type Apply [a1627953356] (TyFun [b1627953357] (TyFun [c1627953358] [d1627953359] -> Type) -> Type) (ZipWith3Sym1 a1627953356 b1627953357 c1627953358 d1627953359 l1) l0 Source # | |
type Apply [b1628251684] (TyFun [c1628251685] (TyFun [d1628251686] [(a1628251683, b1628251684, c1628251685, d1628251686)] -> Type) -> Type) (Zip4Sym1 b1628251684 c1628251685 d1628251686 a1628251683 l1) l0 Source # | |
type Apply [a1628251678] (TyFun [b1628251679] (TyFun [c1628251680] (TyFun [d1628251681] (TyFun [e1628251682] [(a1628251678, b1628251679, c1628251680, d1628251681, e1628251682)] -> Type) -> Type) -> Type) -> Type) (Zip5Sym0 a1628251678 b1628251679 c1628251680 d1628251681 e1628251682) l0 Source # | |
type Apply [b1627953357] (TyFun [c1627953358] [d1627953359] -> Type) (ZipWith3Sym2 a1627953356 b1627953357 c1627953358 d1627953359 l1 l2) l0 Source # | |
type Apply [c1628251685] (TyFun [d1628251686] [(a1628251683, b1628251684, c1628251685, d1628251686)] -> Type) (Zip4Sym2 c1628251685 d1628251686 b1628251684 a1628251683 l1 l2) l0 Source # | |
type Apply [b1628251679] (TyFun [c1628251680] (TyFun [d1628251681] (TyFun [e1628251682] [(a1628251678, b1628251679, c1628251680, d1628251681, e1628251682)] -> Type) -> Type) -> Type) (Zip5Sym1 b1628251679 c1628251680 d1628251681 e1628251682 a1628251678 l1) l0 Source # | |
type Apply [a1628251672] (TyFun [b1628251673] (TyFun [c1628251674] (TyFun [d1628251675] (TyFun [e1628251676] (TyFun [f1628251677] [(a1628251672, b1628251673, c1628251674, d1628251675, e1628251676, f1628251677)] -> Type) -> Type) -> Type) -> Type) -> Type) (Zip6Sym0 a1628251672 b1628251673 c1628251674 d1628251675 e1628251676 f1628251677) l0 Source # | |
type Apply [a1628251660] (TyFun [b1628251661] (TyFun [c1628251662] (TyFun [d1628251663] [e1628251664] -> Type) -> Type) -> Type) (ZipWith4Sym1 a1628251660 b1628251661 c1628251662 d1628251663 e1628251664 l1) l0 Source # | |
type Apply [c1628251680] (TyFun [d1628251681] (TyFun [e1628251682] [(a1628251678, b1628251679, c1628251680, d1628251681, e1628251682)] -> Type) -> Type) (Zip5Sym2 c1628251680 d1628251681 e1628251682 b1628251679 a1628251678 l1 l2) l0 Source # | |
type Apply [b1628251673] (TyFun [c1628251674] (TyFun [d1628251675] (TyFun [e1628251676] (TyFun [f1628251677] [(a1628251672, b1628251673, c1628251674, d1628251675, e1628251676, f1628251677)] -> Type) -> Type) -> Type) -> Type) (Zip6Sym1 b1628251673 c1628251674 d1628251675 e1628251676 f1628251677 a1628251672 l1) l0 Source # | |
type Apply [a1628251665] (TyFun [b1628251666] (TyFun [c1628251667] (TyFun [d1628251668] (TyFun [e1628251669] (TyFun [f1628251670] (TyFun [g1628251671] [(a1628251665, b1628251666, c1628251667, d1628251668, e1628251669, f1628251670, g1628251671)] -> Type) -> Type) -> Type) -> Type) -> Type) -> Type) (Zip7Sym0 a1628251665 b1628251666 c1628251667 d1628251668 e1628251669 f1628251670 g1628251671) l0 Source # | |
type Apply [b1628251661] (TyFun [c1628251662] (TyFun [d1628251663] [e1628251664] -> Type) -> Type) (ZipWith4Sym2 a1628251660 b1628251661 c1628251662 d1628251663 e1628251664 l1 l2) l0 Source # | |
type Apply [a1628251654] (TyFun [b1628251655] (TyFun [c1628251656] (TyFun [d1628251657] (TyFun [e1628251658] [f1628251659] -> Type) -> Type) -> Type) -> Type) (ZipWith5Sym1 a1628251654 b1628251655 c1628251656 d1628251657 e1628251658 f1628251659 l1) l0 Source # | |
type Apply [d1628251681] (TyFun [e1628251682] [(a1628251678, b1628251679, c1628251680, d1628251681, e1628251682)] -> Type) (Zip5Sym3 d1628251681 e1628251682 c1628251680 b1628251679 a1628251678 l1 l2 l3) l0 Source # | |
type Apply [c1628251674] (TyFun [d1628251675] (TyFun [e1628251676] (TyFun [f1628251677] [(a1628251672, b1628251673, c1628251674, d1628251675, e1628251676, f1628251677)] -> Type) -> Type) -> Type) (Zip6Sym2 c1628251674 d1628251675 e1628251676 f1628251677 b1628251673 a1628251672 l1 l2) l0 Source # | |
type Apply [b1628251666] (TyFun [c1628251667] (TyFun [d1628251668] (TyFun [e1628251669] (TyFun [f1628251670] (TyFun [g1628251671] [(a1628251665, b1628251666, c1628251667, d1628251668, e1628251669, f1628251670, g1628251671)] -> Type) -> Type) -> Type) -> Type) -> Type) (Zip7Sym1 b1628251666 c1628251667 d1628251668 e1628251669 f1628251670 g1628251671 a1628251665 l1) l0 Source # | |
type Apply [c1628251662] (TyFun [d1628251663] [e1628251664] -> Type) (ZipWith4Sym3 a1628251660 b1628251661 c1628251662 d1628251663 e1628251664 l1 l2 l3) l0 Source # | |
type Apply [b1628251655] (TyFun [c1628251656] (TyFun [d1628251657] (TyFun [e1628251658] [f1628251659] -> Type) -> Type) -> Type) (ZipWith5Sym2 a1628251654 b1628251655 c1628251656 d1628251657 e1628251658 f1628251659 l1 l2) l0 Source # | |
type Apply [a1628251647] (TyFun [b1628251648] (TyFun [c1628251649] (TyFun [d1628251650] (TyFun [e1628251651] (TyFun [f1628251652] [g1628251653] -> Type) -> Type) -> Type) -> Type) -> Type) (ZipWith6Sym1 a1628251647 b1628251648 c1628251649 d1628251650 e1628251651 f1628251652 g1628251653 l1) l0 Source # | |
type Apply [d1628251675] (TyFun [e1628251676] (TyFun [f1628251677] [(a1628251672, b1628251673, c1628251674, d1628251675, e1628251676, f1628251677)] -> Type) -> Type) (Zip6Sym3 d1628251675 e1628251676 f1628251677 c1628251674 b1628251673 a1628251672 l1 l2 l3) l0 Source # | |
type Apply [c1628251667] (TyFun [d1628251668] (TyFun [e1628251669] (TyFun [f1628251670] (TyFun [g1628251671] [(a1628251665, b1628251666, c1628251667, d1628251668, e1628251669, f1628251670, g1628251671)] -> Type) -> Type) -> Type) -> Type) (Zip7Sym2 c1628251667 d1628251668 e1628251669 f1628251670 g1628251671 b1628251666 a1628251665 l1 l2) l0 Source # | |
type Apply [c1628251656] (TyFun [d1628251657] (TyFun [e1628251658] [f1628251659] -> Type) -> Type) (ZipWith5Sym3 a1628251654 b1628251655 c1628251656 d1628251657 e1628251658 f1628251659 l1 l2 l3) l0 Source # | |
type Apply [b1628251648] (TyFun [c1628251649] (TyFun [d1628251650] (TyFun [e1628251651] (TyFun [f1628251652] [g1628251653] -> Type) -> Type) -> Type) -> Type) (ZipWith6Sym2 a1628251647 b1628251648 c1628251649 d1628251650 e1628251651 f1628251652 g1628251653 l1 l2) l0 Source # | |
type Apply [a1628251639] (TyFun [b1628251640] (TyFun [c1628251641] (TyFun [d1628251642] (TyFun [e1628251643] (TyFun [f1628251644] (TyFun [g1628251645] [h1628251646] -> Type) -> Type) -> Type) -> Type) -> Type) -> Type) (ZipWith7Sym1 a1628251639 b1628251640 c1628251641 d1628251642 e1628251643 f1628251644 g1628251645 h1628251646 l1) l0 Source # | |
type Apply [e1628251676] (TyFun [f1628251677] [(a1628251672, b1628251673, c1628251674, d1628251675, e1628251676, f1628251677)] -> Type) (Zip6Sym4 e1628251676 f1628251677 d1628251675 c1628251674 b1628251673 a1628251672 l1 l2 l3 l4) l0 Source # | |
type Apply [d1628251668] (TyFun [e1628251669] (TyFun [f1628251670] (TyFun [g1628251671] [(a1628251665, b1628251666, c1628251667, d1628251668, e1628251669, f1628251670, g1628251671)] -> Type) -> Type) -> Type) (Zip7Sym3 d1628251668 e1628251669 f1628251670 g1628251671 c1628251667 b1628251666 a1628251665 l1 l2 l3) l0 Source # | |
type Apply [d1628251657] (TyFun [e1628251658] [f1628251659] -> Type) (ZipWith5Sym4 a1628251654 b1628251655 c1628251656 d1628251657 e1628251658 f1628251659 l1 l2 l3 l4) l0 Source # | |
type Apply [c1628251649] (TyFun [d1628251650] (TyFun [e1628251651] (TyFun [f1628251652] [g1628251653] -> Type) -> Type) -> Type) (ZipWith6Sym3 a1628251647 b1628251648 c1628251649 d1628251650 e1628251651 f1628251652 g1628251653 l1 l2 l3) l0 Source # | |
type Apply [b1628251640] (TyFun [c1628251641] (TyFun [d1628251642] (TyFun [e1628251643] (TyFun [f1628251644] (TyFun [g1628251645] [h1628251646] -> Type) -> Type) -> Type) -> Type) -> Type) (ZipWith7Sym2 a1628251639 b1628251640 c1628251641 d1628251642 e1628251643 f1628251644 g1628251645 h1628251646 l1 l2) l0 Source # | |
type Apply [e1628251669] (TyFun [f1628251670] (TyFun [g1628251671] [(a1628251665, b1628251666, c1628251667, d1628251668, e1628251669, f1628251670, g1628251671)] -> Type) -> Type) (Zip7Sym4 e1628251669 f1628251670 g1628251671 d1628251668 c1628251667 b1628251666 a1628251665 l1 l2 l3 l4) l0 Source # | |
type Apply [d1628251650] (TyFun [e1628251651] (TyFun [f1628251652] [g1628251653] -> Type) -> Type) (ZipWith6Sym4 a1628251647 b1628251648 c1628251649 d1628251650 e1628251651 f1628251652 g1628251653 l1 l2 l3 l4) l0 Source # | |
type Apply [c1628251641] (TyFun [d1628251642] (TyFun [e1628251643] (TyFun [f1628251644] (TyFun [g1628251645] [h1628251646] -> Type) -> Type) -> Type) -> Type) (ZipWith7Sym3 a1628251639 b1628251640 c1628251641 d1628251642 e1628251643 f1628251644 g1628251645 h1628251646 l1 l2 l3) l0 Source # | |
type Apply [f1628251670] (TyFun [g1628251671] [(a1628251665, b1628251666, c1628251667, d1628251668, e1628251669, f1628251670, g1628251671)] -> Type) (Zip7Sym5 f1628251670 g1628251671 e1628251669 d1628251668 c1628251667 b1628251666 a1628251665 l1 l2 l3 l4 l5) l0 Source # | |
type Apply [e1628251651] (TyFun [f1628251652] [g1628251653] -> Type) (ZipWith6Sym5 a1628251647 b1628251648 c1628251649 d1628251650 e1628251651 f1628251652 g1628251653 l1 l2 l3 l4 l5) l0 Source # | |
type Apply [d1628251642] (TyFun [e1628251643] (TyFun [f1628251644] (TyFun [g1628251645] [h1628251646] -> Type) -> Type) -> Type) (ZipWith7Sym4 a1628251639 b1628251640 c1628251641 d1628251642 e1628251643 f1628251644 g1628251645 h1628251646 l1 l2 l3 l4) l0 Source # | |
type Apply [e1628251643] (TyFun [f1628251644] (TyFun [g1628251645] [h1628251646] -> Type) -> Type) (ZipWith7Sym5 a1628251639 b1628251640 c1628251641 d1628251642 e1628251643 f1628251644 g1628251645 h1628251646 l1 l2 l3 l4 l5) l0 Source # | |
type Apply [f1628251644] (TyFun [g1628251645] [h1628251646] -> Type) (ZipWith7Sym6 a1628251639 b1628251640 c1628251641 d1628251642 e1628251643 f1628251644 g1628251645 h1628251646 l1 l2 l3 l4 l5 l6) l0 Source # | |
type DemoteRep ((~>) k1 k2) Source # | |
data Sing ((~>) k1 k2) Source # | |
type Apply (TyFun a1627845465 Bool -> Type) (TyFun (TyFun a1627845465 a1627845465 -> Type) (TyFun a1627845465 a1627845465 -> Type) -> Type) (UntilSym0 a1627845465) l0 Source # | |
type Apply (TyFun a1627942712 Bool -> Type) (TyFun [a1627942712] Bool -> Type) (Any_Sym0 a1627942712) l0 Source # | |
type Apply (TyFun a1627953310 Bool -> Type) (TyFun [a1627953310] [a1627953310] -> Type) (DropWhileEndSym0 a1627953310) l0 Source # | |
type Apply (TyFun a1627953394 (TyFun a1627953394 a1627953394 -> Type) -> Type) (TyFun [a1627953394] a1627953394 -> Type) (Foldl1'Sym0 a1627953394) l0 Source # | |
type Apply (TyFun a1627953321 (TyFun a1627953321 Ordering -> Type) -> Type) (TyFun [a1627953321] a1627953321 -> Type) (MinimumBySym0 a1627953321) l0 Source # | |
type Apply (TyFun a1627953322 (TyFun a1627953322 Ordering -> Type) -> Type) (TyFun [a1627953322] a1627953322 -> Type) (MaximumBySym0 a1627953322) l0 Source # | |
type Apply (TyFun a1627953395 (TyFun a1627953395 a1627953395 -> Type) -> Type) (TyFun [a1627953395] a1627953395 -> Type) (Foldl1Sym0 a1627953395) l0 Source # | |
type Apply (TyFun a1627953393 (TyFun a1627953393 a1627953393 -> Type) -> Type) (TyFun [a1627953393] a1627953393 -> Type) (Foldr1Sym0 a1627953393) l0 Source # | |
type Apply (TyFun a1627953389 Bool -> Type) (TyFun [a1627953389] Bool -> Type) (AllSym0 a1627953389) l0 Source # | |
type Apply (TyFun a1627953386 (TyFun a1627953386 a1627953386 -> Type) -> Type) (TyFun [a1627953386] [a1627953386] -> Type) (Scanl1Sym0 a1627953386) l0 Source # | |
type Apply (TyFun a1627953383 (TyFun a1627953383 a1627953383 -> Type) -> Type) (TyFun [a1627953383] [a1627953383] -> Type) (Scanr1Sym0 a1627953383) l0 Source # | |
type Apply (TyFun a1627953316 Bool -> Type) (TyFun [a1627953316] (Maybe Nat) -> Type) (FindIndexSym0 a1627953316) l0 Source # | |
type Apply (TyFun a1627953315 Bool -> Type) (TyFun [a1627953315] [Nat] -> Type) (FindIndicesSym0 a1627953315) l0 Source # | |
type Apply (TyFun a1627953285 (TyFun a1627953285 Bool -> Type) -> Type) (TyFun [a1627953285] (TyFun [a1627953285] [a1627953285] -> Type) -> Type) (UnionBySym0 a1627953285) l0 Source # | |
type Apply (TyFun a1627953325 (TyFun a1627953325 Bool -> Type) -> Type) (TyFun [a1627953325] (TyFun [a1627953325] [a1627953325] -> Type) -> Type) (DeleteFirstsBySym0 a1627953325) l0 Source # | |
type Apply (TyFun a1627953326 (TyFun a1627953326 Bool -> Type) -> Type) (TyFun a1627953326 (TyFun [a1627953326] [a1627953326] -> Type) -> Type) (DeleteBySym0 a1627953326) l0 Source # | |
type Apply (TyFun a1627953324 (TyFun a1627953324 Ordering -> Type) -> Type) (TyFun [a1627953324] [a1627953324] -> Type) (SortBySym0 a1627953324) l0 Source # | |
type Apply (TyFun a1627953323 (TyFun a1627953323 Ordering -> Type) -> Type) (TyFun a1627953323 (TyFun [a1627953323] [a1627953323] -> Type) -> Type) (InsertBySym0 a1627953323) l0 Source # | |
type Apply (TyFun a1627953313 (TyFun a1627953313 Bool -> Type) -> Type) (TyFun [a1627953313] (TyFun [a1627953313] [a1627953313] -> Type) -> Type) (IntersectBySym0 a1627953313) l0 Source # | |
type Apply (TyFun a1627953319 Bool -> Type) (TyFun [a1627953319] (Maybe a1627953319) -> Type) (FindSym0 a1627953319) l0 Source # | |
type Apply (TyFun a1627953320 Bool -> Type) (TyFun [a1627953320] [a1627953320] -> Type) (FilterSym0 a1627953320) l0 Source # | |
type Apply (TyFun a1627953312 Bool -> Type) (TyFun [a1627953312] [a1627953312] -> Type) (TakeWhileSym0 a1627953312) l0 Source # | |
type Apply (TyFun a1627953311 Bool -> Type) (TyFun [a1627953311] [a1627953311] -> Type) (DropWhileSym0 a1627953311) l0 Source # | |
type Apply (TyFun a1627953299 (TyFun a1627953299 Bool -> Type) -> Type) (TyFun [a1627953299] [[a1627953299]] -> Type) (GroupBySym0 a1627953299) l0 Source # | |
type Apply (TyFun a1627953309 Bool -> Type) (TyFun [a1627953309] ([a1627953309], [a1627953309]) -> Type) (SpanSym0 a1627953309) l0 Source # | |
type Apply (TyFun a1627953308 Bool -> Type) (TyFun [a1627953308] ([a1627953308], [a1627953308]) -> Type) (BreakSym0 a1627953308) l0 Source # | |
type Apply (TyFun a1627953296 Bool -> Type) (TyFun [a1627953296] ([a1627953296], [a1627953296]) -> Type) (PartitionSym0 a1627953296) l0 Source # | |
type Apply (TyFun a1627953287 (TyFun a1627953287 Bool -> Type) -> Type) (TyFun [a1627953287] [a1627953287] -> Type) (NubBySym0 a1627953287) l0 Source # | |
type Apply (TyFun b1627619913 (TyFun a1627619912 b1627619913 -> Type) -> Type) (TyFun b1627619913 (TyFun [a1627619912] b1627619913 -> Type) -> Type) (FoldlSym0 a1627619912 b1627619913) l0 Source # | |
type Apply (TyFun a b -> *) (TyFun a b -> *) (($!$) a b) arg Source # | |
type Apply (TyFun a b -> *) (TyFun a b -> *) (($$) a b) arg Source # | |
type Apply (TyFun a1627796657 (TyFun b1627796658 b1627796658 -> Type) -> Type) (TyFun b1627796658 (TyFun [a1627796657] b1627796658 -> Type) -> Type) (FoldrSym0 a1627796657 b1627796658) l0 Source # | |
type Apply (TyFun a1627796655 b1627796656 -> Type) (TyFun [a1627796655] [b1627796656] -> Type) (MapSym0 a1627796655 b1627796656) l0 Source # | |
type Apply (TyFun a1627845465 a1627845465 -> Type) (TyFun a1627845465 a1627845465 -> Type) (UntilSym1 a1627845465 l1) l0 Source # | |
type Apply (TyFun a1627849028 (Maybe b1627849029) -> Type) (TyFun [a1627849028] [b1627849029] -> Type) (MapMaybeSym0 a1627849028 b1627849029) l0 Source # | |
type Apply (TyFun b1627953397 (TyFun a1627953396 b1627953397 -> Type) -> Type) (TyFun b1627953397 (TyFun [a1627953396] b1627953397 -> Type) -> Type) (Foldl'Sym0 a1627953396 b1627953397) l0 Source # | |
type Apply (TyFun a1627953390 [b1627953391] -> Type) (TyFun [a1627953390] [b1627953391] -> Type) (ConcatMapSym0 a1627953390 b1627953391) l0 Source # | |
type Apply (TyFun b1627953387 (TyFun a1627953388 b1627953387 -> Type) -> Type) (TyFun b1627953387 (TyFun [a1627953388] [b1627953387] -> Type) -> Type) (ScanlSym0 a1627953388 b1627953387) l0 Source # | |
type Apply (TyFun a1627953384 (TyFun b1627953385 b1627953385 -> Type) -> Type) (TyFun b1627953385 (TyFun [a1627953384] [b1627953385] -> Type) -> Type) (ScanrSym0 a1627953384 b1627953385) l0 Source # | |
type Apply (TyFun b1627953375 (Maybe (a1627953376, b1627953375)) -> Type) (TyFun b1627953375 [a1627953376] -> Type) (UnfoldrSym0 b1627953375 a1627953376) l0 Source # | |
type Apply (TyFun (a1627840724, b1627840725) c1627840726 -> Type) (TyFun a1627840724 (TyFun b1627840725 c1627840726 -> Type) -> Type) (CurrySym0 a1627840724 b1627840725 c1627840726) l0 Source # | |
type Apply (TyFun b1627796648 c1627796649 -> Type) (TyFun (TyFun a1627796650 b1627796648 -> Type) (TyFun a1627796650 c1627796649 -> Type) -> Type) ((:.$) b1627796648 a1627796650 c1627796649) l0 Source # | |
type Apply (TyFun a1627796645 (TyFun b1627796646 c1627796647 -> Type) -> Type) (TyFun b1627796646 (TyFun a1627796645 c1627796647 -> Type) -> Type) (FlipSym0 b1627796646 a1627796645 c1627796647) l0 Source # | |
type Apply (TyFun a1627829180 c1627829181 -> Type) (TyFun (TyFun b1627829182 c1627829181 -> Type) (TyFun (Either a1627829180 b1627829182) c1627829181 -> Type) -> Type) (Either_Sym0 a1627829180 b1627829182 c1627829181) l0 Source # | |
type Apply (TyFun a1627840721 (TyFun b1627840722 c1627840723 -> Type) -> Type) (TyFun (a1627840721, b1627840722) c1627840723 -> Type) (UncurrySym0 a1627840721 b1627840722 c1627840723) l0 Source # | |
type Apply (TyFun a1627847772 b1627847771 -> Type) (TyFun (Maybe a1627847772) b1627847771 -> Type) (Maybe_Sym1 a1627847772 b1627847771 l1) l0 Source # | |
type Apply (TyFun acc1627953380 (TyFun x1627953381 (acc1627953380, y1627953382) -> Type) -> Type) (TyFun acc1627953380 (TyFun [x1627953381] (acc1627953380, [y1627953382]) -> Type) -> Type) (MapAccumLSym0 x1627953381 acc1627953380 y1627953382) l0 Source # | |
type Apply (TyFun acc1627953377 (TyFun x1627953378 (acc1627953377, y1627953379) -> Type) -> Type) (TyFun acc1627953377 (TyFun [x1627953378] (acc1627953377, [y1627953379]) -> Type) -> Type) (MapAccumRSym0 x1627953378 acc1627953377 y1627953379) l0 Source # | |
type Apply (TyFun a1627953360 (TyFun b1627953361 c1627953362 -> Type) -> Type) (TyFun [a1627953360] (TyFun [b1627953361] [c1627953362] -> Type) -> Type) (ZipWithSym0 a1627953360 b1627953361 c1627953362) l0 Source # | |
type Apply (TyFun a1627796650 b1627796648 -> Type) (TyFun a1627796650 c1627796649 -> Type) ((:.$$) a1627796650 b1627796648 c1627796649 l1) l0 Source # | |
type Apply (TyFun b1627829182 c1627829181 -> Type) (TyFun (Either a1627829180 b1627829182) c1627829181 -> Type) (Either_Sym1 b1627829182 a1627829180 c1627829181 l1) l0 Source # | |
type Apply (TyFun a1627953356 (TyFun b1627953357 (TyFun c1627953358 d1627953359 -> Type) -> Type) -> Type) (TyFun [a1627953356] (TyFun [b1627953357] (TyFun [c1627953358] [d1627953359] -> Type) -> Type) -> Type) (ZipWith3Sym0 a1627953356 b1627953357 c1627953358 d1627953359) l0 Source # | |
type Apply (TyFun a1628251660 (TyFun b1628251661 (TyFun c1628251662 (TyFun d1628251663 e1628251664 -> Type) -> Type) -> Type) -> Type) (TyFun [a1628251660] (TyFun [b1628251661] (TyFun [c1628251662] (TyFun [d1628251663] [e1628251664] -> Type) -> Type) -> Type) -> Type) (ZipWith4Sym0 a1628251660 b1628251661 c1628251662 d1628251663 e1628251664) l0 Source # | |
type Apply (TyFun a1628251654 (TyFun b1628251655 (TyFun c1628251656 (TyFun d1628251657 (TyFun e1628251658 f1628251659 -> Type) -> Type) -> Type) -> Type) -> Type) (TyFun [a1628251654] (TyFun [b1628251655] (TyFun [c1628251656] (TyFun [d1628251657] (TyFun [e1628251658] [f1628251659] -> Type) -> Type) -> Type) -> Type) -> Type) (ZipWith5Sym0 a1628251654 b1628251655 c1628251656 d1628251657 e1628251658 f1628251659) l0 Source # | |
type Apply (TyFun a1628251647 (TyFun b1628251648 (TyFun c1628251649 (TyFun d1628251650 (TyFun e1628251651 (TyFun f1628251652 g1628251653 -> Type) -> Type) -> Type) -> Type) -> Type) -> Type) (TyFun [a1628251647] (TyFun [b1628251648] (TyFun [c1628251649] (TyFun [d1628251650] (TyFun [e1628251651] (TyFun [f1628251652] [g1628251653] -> Type) -> Type) -> Type) -> Type) -> Type) -> Type) (ZipWith6Sym0 a1628251647 b1628251648 c1628251649 d1628251650 e1628251651 f1628251652 g1628251653) l0 Source # | |
type Apply (TyFun a1628251639 (TyFun b1628251640 (TyFun c1628251641 (TyFun d1628251642 (TyFun e1628251643 (TyFun f1628251644 (TyFun g1628251645 h1628251646 -> Type) -> Type) -> Type) -> Type) -> Type) -> Type) -> Type) (TyFun [a1628251639] (TyFun [b1628251640] (TyFun [c1628251641] (TyFun [d1628251642] (TyFun [e1628251643] (TyFun [f1628251644] (TyFun [g1628251645] [h1628251646] -> Type) -> Type) -> Type) -> Type) -> Type) -> Type) -> Type) (ZipWith7Sym0 a1628251639 b1628251640 c1628251641 d1628251642 e1628251643 f1628251644 g1628251645 h1628251646) l0 Source # | |
type (~>) a b = TyFun a b -> * infixr 0 Source #
Something of kind `a ~> b` is a defunctionalized type function that is not necessarily generative or injective.
data TyCon1 :: (k1 -> k2) -> k1 ~> k2 Source #
Wrapper for converting the normal type-level arrow into a ~>
.
For example, given:
data Nat = Zero | Succ Nat type family Map (a :: a ~> b) (a :: [a]) :: [b] Map f '[] = '[] Map f (x ': xs) = Apply f x ': Map f xs
We can write:
Map (TyCon1 Succ) [Zero, Succ Zero]
data TyCon2 :: (k1 -> k2 -> k3) -> k1 ~> (k2 ~> k3) Source #
Similar to TyCon1
, but for two-parameter type constructors.
data TyCon5 :: (k1 -> k2 -> k3 -> k4 -> k5 -> k6) -> k1 ~> (k2 ~> (k3 ~> (k4 ~> (k5 ~> k6)))) Source #
data TyCon6 :: (k1 -> k2 -> k3 -> k4 -> k5 -> k6 -> k7) -> k1 ~> (k2 ~> (k3 ~> (k4 ~> (k5 ~> (k6 ~> k7))))) Source #
data TyCon7 :: (k1 -> k2 -> k3 -> k4 -> k5 -> k6 -> k7 -> k8) -> k1 ~> (k2 ~> (k3 ~> (k4 ~> (k5 ~> (k6 ~> (k7 ~> k8)))))) Source #
data TyCon8 :: (k1 -> k2 -> k3 -> k4 -> k5 -> k6 -> k7 -> k8 -> k9) -> k1 ~> (k2 ~> (k3 ~> (k4 ~> (k5 ~> (k6 ~> (k7 ~> (k8 ~> k9))))))) Source #
type family Apply (f :: k1 ~> k2) (x :: k1) :: k2 Source #
Type level function application
type Apply Bool Bool NotSym0 l0 Source # | |
type Apply Bool Bool ((:&&$$) l1) l0 Source # | |
type Apply Bool Bool ((:||$$) l1) l0 Source # | |
type Apply Ordering Ordering (ThenCmpSym1 l1) l0 Source # | |
type Apply Nat Nat ((:^$$) l1) l0 Source # | |
type Apply Nat k2 (FromIntegerSym0 k2) l0 Source # | |
type Apply Nat k2 (ToEnumSym0 k2) l0 Source # | |
type Apply a1627796653 a1627796653 (IdSym0 a1627796653) l0 Source # | |
type Apply a1627817219 a1627817219 (SignumSym0 a1627817219) l0 Source # | |
type Apply a1627817219 a1627817219 (AbsSym0 a1627817219) l0 Source # | |
type Apply a1627817219 a1627817219 (NegateSym0 a1627817219) l0 Source # | |
type Apply a1627864213 Nat (FromEnumSym0 a1627864213) l0 Source # | |
type Apply a1627864213 a1627864213 (PredSym0 a1627864213) l0 Source # | |
type Apply a1627864213 a1627864213 (SuccSym0 a1627864213) l0 Source # | |
type Apply Nat a1627953289 ((:!!$$) a1627953289 l1) l0 Source # | |
type Apply a1627662065 Bool ((:/=$$) a1627662065 l1) l0 Source # | |
type Apply a1627662065 Bool ((:==$$) a1627662065 l1) l0 Source # | |
type Apply a1627682221 a1627682221 (MinSym1 a1627682221 l1) l0 Source # | |
type Apply a1627682221 a1627682221 (MaxSym1 a1627682221 l1) l0 Source # | |
type Apply a1627682221 Bool ((:>=$$) a1627682221 l1) l0 Source # | |
type Apply a1627682221 Bool ((:>$$) a1627682221 l1) l0 Source # | |
type Apply a1627682221 Bool ((:<=$$) a1627682221 l1) l0 Source # | |
type Apply a1627682221 Bool ((:<$$) a1627682221 l1) l0 Source # | |
type Apply a1627682221 Ordering (CompareSym1 a1627682221 l1) l0 Source # | |
type Apply a1627796644 a1627796644 (AsTypeOfSym1 a1627796644 l1) l0 Source # | |
type Apply k01627810588 k2 (ErrorSym0 k01627810588 k2) l0 Source # | |
type Apply a1627817219 a1627817219 ((:*$$) a1627817219 l1) l0 Source # | |
type Apply a1627817219 a1627817219 ((:-$$) a1627817219 l1) l0 Source # | |
type Apply a1627817219 a1627817219 ((:+$$) a1627817219 l1) l0 Source # | |
type Apply a1627819601 a1627819601 (SubtractSym1 a1627819601 l1) l0 Source # | |
type Apply Bool a1627657621 (Bool_Sym2 a1627657621 l1 l2) l0 Source # | |
type Apply k1 k2 (TyCon1 k1 k2 f) x Source # | |
type Apply a b (($!$$) a b f) arg Source # | |
type Apply a b (($$$) a b f) arg Source # | |
type Apply b1627796652 a1627796651 (ConstSym1 b1627796652 a1627796651 l1) l0 Source # | |
type Apply b1627796643 b1627796643 (SeqSym1 b1627796643 a1627796642 l1) l0 Source # | |
type Apply a1627845465 a1627845465 (UntilSym2 a1627845465 l1 l2) l0 Source # | |
type Apply i1628251631 a1628251632 (GenericIndexSym1 i1628251631 a1628251632 l1) l0 Source # | |
type Apply a1627796650 c1627796649 ((:.$$$) a1627796650 b1627796648 c1627796649 l1 l2) l0 Source # | |
type Apply a1627796645 c1627796647 (FlipSym2 a1627796645 b1627796646 c1627796647 l1 l2) l0 Source # | |
type Apply b1627840725 c1627840726 (CurrySym2 a1627840724 b1627840725 c1627840726 l1 l2) l0 Source # | |
type Apply a822083586 (Maybe a822083586) (JustSym0 a822083586) l0 Source # | |
type Apply a1627864213 [a1627864213] (EnumFromToSym1 a1627864213 l1) l0 Source # | |
type Apply a1627953291 [a1627953291] (ReplicateSym1 a1627953291 l1) l0 Source # | |
type Apply a1627864213 [a1627864213] (EnumFromThenToSym2 a1627864213 l1 l2) l0 Source # | |
type Apply b1627953375 [a1627953376] (UnfoldrSym1 a1627953376 b1627953375 l1) l0 Source # | |
type Apply a1628251630 [a1628251630] (GenericReplicateSym1 a1628251630 i1628251629 l1) l0 Source # | |
type Apply Bool (TyFun Bool Bool -> Type) (:&&$) l0 Source # | |
type Apply Bool (TyFun Bool Bool -> Type) (:||$) l0 Source # | |
type Apply Ordering (TyFun Ordering Ordering -> Type) ThenCmpSym0 l0 Source # | |
type Apply Nat (TyFun Nat Nat -> *) (:^$) l0 Source # | |
type Apply Nat (TyFun [a1627953305] ([a1627953305], [a1627953305]) -> Type) (SplitAtSym0 a1627953305) l0 Source # | |
type Apply Nat (TyFun [a1627953307] [a1627953307] -> Type) (TakeSym0 a1627953307) l0 Source # | |
type Apply Nat (TyFun [a1627953306] [a1627953306] -> Type) (DropSym0 a1627953306) l0 Source # | |
type Apply Nat (TyFun a1627953291 [a1627953291] -> Type) (ReplicateSym0 a1627953291) l0 Source # | |
type Apply a822083586 (TyFun [a822083586] [a822083586] -> Type) ((:$) a822083586) l0 Source # | |
type Apply a1627657621 (TyFun a1627657621 (TyFun Bool a1627657621 -> Type) -> Type) (Bool_Sym0 a1627657621) l0 Source # | |
type Apply a1627662065 (TyFun a1627662065 Bool -> Type) ((:/=$) a1627662065) l0 Source # | |
type Apply a1627662065 (TyFun a1627662065 Bool -> Type) ((:==$) a1627662065) l0 Source # | |
type Apply a1627682221 (TyFun a1627682221 a1627682221 -> Type) (MinSym0 a1627682221) l0 Source # | |
type Apply a1627682221 (TyFun a1627682221 a1627682221 -> Type) (MaxSym0 a1627682221) l0 Source # | |
type Apply a1627682221 (TyFun a1627682221 Bool -> Type) ((:>=$) a1627682221) l0 Source # | |
type Apply a1627682221 (TyFun a1627682221 Bool -> Type) ((:>$) a1627682221) l0 Source # | |
type Apply a1627682221 (TyFun a1627682221 Bool -> Type) ((:<=$) a1627682221) l0 Source # | |
type Apply a1627682221 (TyFun a1627682221 Bool -> Type) ((:<$) a1627682221) l0 Source # | |
type Apply a1627682221 (TyFun a1627682221 Ordering -> Type) (CompareSym0 a1627682221) l0 Source # | |
type Apply a1627796644 (TyFun a1627796644 a1627796644 -> Type) (AsTypeOfSym0 a1627796644) l0 Source # | |
type Apply a1627817219 (TyFun a1627817219 a1627817219 -> Type) ((:*$) a1627817219) l0 Source # | |
type Apply a1627817219 (TyFun a1627817219 a1627817219 -> Type) ((:-$) a1627817219) l0 Source # | |
type Apply a1627817219 (TyFun a1627817219 a1627817219 -> Type) ((:+$) a1627817219) l0 Source # | |
type Apply a1627819601 (TyFun a1627819601 a1627819601 -> Type) (SubtractSym0 a1627819601) l0 Source # | |
type Apply a1627849033 (TyFun (Maybe a1627849033) a1627849033 -> Type) (FromMaybeSym0 a1627849033) l0 Source # | |
type Apply a1627864213 (TyFun a1627864213 (TyFun a1627864213 [a1627864213] -> Type) -> Type) (EnumFromThenToSym0 a1627864213) l0 Source # | |
type Apply a1627864213 (TyFun a1627864213 [a1627864213] -> Type) (EnumFromToSym0 a1627864213) l0 Source # | |
type Apply a1627953403 (TyFun [a1627953403] [a1627953403] -> Type) (IntersperseSym0 a1627953403) l0 Source # | |
type Apply a1627953369 (TyFun [a1627953369] Bool -> Type) (ElemSym0 a1627953369) l0 Source # | |
type Apply a1627953368 (TyFun [a1627953368] Bool -> Type) (NotElemSym0 a1627953368) l0 Source # | |
type Apply a1627953318 (TyFun [a1627953318] (Maybe Nat) -> Type) (ElemIndexSym0 a1627953318) l0 Source # | |
type Apply a1627953317 (TyFun [a1627953317] [Nat] -> Type) (ElemIndicesSym0 a1627953317) l0 Source # | |
type Apply a1627953328 (TyFun [a1627953328] [a1627953328] -> Type) (DeleteSym0 a1627953328) l0 Source # | |
type Apply a1627953301 (TyFun [a1627953301] [a1627953301] -> Type) (InsertSym0 a1627953301) l0 Source # | |
type Apply a822083586 (TyFun b822083587 (a822083586, b822083587) -> Type) (Tuple2Sym0 a822083586 b822083587) l0 Source # | |
type Apply b1627437721 (Either a1627437720 b1627437721) (RightSym0 a1627437720 b1627437721) l0 Source # | |
type Apply a1627437720 (Either a1627437720 b1627437721) (LeftSym0 a1627437720 b1627437721) l0 Source # | |
type Apply a1627657621 (TyFun Bool a1627657621 -> Type) (Bool_Sym1 a1627657621 l1) l0 Source # | |
type Apply a1627796651 (TyFun b1627796652 a1627796651 -> Type) (ConstSym0 b1627796652 a1627796651) l0 Source # | |
type Apply a1627796642 (TyFun b1627796643 b1627796643 -> Type) (SeqSym0 a1627796642 b1627796643) l0 Source # | |
type Apply b1627847771 (TyFun (TyFun a1627847772 b1627847771 -> Type) (TyFun (Maybe a1627847772) b1627847771 -> Type) -> Type) (Maybe_Sym0 a1627847772 b1627847771) l0 Source # | |
type Apply a1627864213 (TyFun a1627864213 [a1627864213] -> Type) (EnumFromThenToSym1 a1627864213 l1) l0 Source # | |
type Apply a1627953326 (TyFun [a1627953326] [a1627953326] -> Type) (DeleteBySym1 a1627953326 l1) l0 Source # | |
type Apply a1627953323 (TyFun [a1627953323] [a1627953323] -> Type) (InsertBySym1 a1627953323 l1) l0 Source # | |
type Apply a1627953297 (TyFun [(a1627953297, b1627953298)] (Maybe b1627953298) -> Type) (LookupSym0 a1627953297 b1627953298) l0 Source # | |
type Apply i1628251637 (TyFun [a1628251638] [a1628251638] -> Type) (GenericTakeSym0 i1628251637 a1628251638) l0 Source # | |
type Apply i1628251635 (TyFun [a1628251636] [a1628251636] -> Type) (GenericDropSym0 i1628251635 a1628251636) l0 Source # | |
type Apply i1628251633 (TyFun [a1628251634] ([a1628251634], [a1628251634]) -> Type) (GenericSplitAtSym0 i1628251633 a1628251634) l0 Source # | |
type Apply i1628251629 (TyFun a1628251630 [a1628251630] -> Type) (GenericReplicateSym0 i1628251629 a1628251630) l0 Source # | |
type Apply a822083586 (TyFun b822083587 (TyFun c822083588 (a822083586, b822083587, c822083588) -> Type) -> Type) (Tuple3Sym0 a822083586 b822083587 c822083588) l0 Source # | |
type Apply b822083587 (a822083586, b822083587) (Tuple2Sym1 b822083587 a822083586 l1) l0 Source # | |
type Apply b1627619913 (TyFun [a1627619912] b1627619913 -> Type) (FoldlSym1 a1627619912 b1627619913 l1) l0 Source # | |
type Apply b1627796658 (TyFun [a1627796657] b1627796658 -> Type) (FoldrSym1 a1627796657 b1627796658 l1) l0 Source # | |
type Apply b1627953397 (TyFun [a1627953396] b1627953397 -> Type) (Foldl'Sym1 a1627953396 b1627953397 l1) l0 Source # | |
type Apply b1627953387 (TyFun [a1627953388] [b1627953387] -> Type) (ScanlSym1 a1627953388 b1627953387 l1) l0 Source # | |
type Apply b1627953385 (TyFun [a1627953384] [b1627953385] -> Type) (ScanrSym1 a1627953384 b1627953385 l1) l0 Source # | |
type Apply k1 ((~>) k2 k3) (TyCon2 k1 k2 k3 f) x Source # | |
type Apply a822083586 (TyFun b822083587 (TyFun c822083588 (TyFun d822083589 (a822083586, b822083587, c822083588, d822083589) -> Type) -> Type) -> Type) (Tuple4Sym0 a822083586 b822083587 c822083588 d822083589) l0 Source # | |
type Apply b822083587 (TyFun c822083588 (a822083586, b822083587, c822083588) -> Type) (Tuple3Sym1 b822083587 c822083588 a822083586 l1) l0 Source # | |
type Apply b1627796646 (TyFun a1627796645 c1627796647 -> Type) (FlipSym1 a1627796645 b1627796646 c1627796647 l1) l0 Source # | |
type Apply a1627840724 (TyFun b1627840725 c1627840726 -> Type) (CurrySym1 a1627840724 b1627840725 c1627840726 l1) l0 Source # | |
type Apply acc1627953380 (TyFun [x1627953381] (acc1627953380, [y1627953382]) -> Type) (MapAccumLSym1 x1627953381 acc1627953380 y1627953382 l1) l0 Source # | |
type Apply acc1627953377 (TyFun [x1627953378] (acc1627953377, [y1627953379]) -> Type) (MapAccumRSym1 x1627953378 acc1627953377 y1627953379 l1) l0 Source # | |
type Apply k1 ((~>) k2 ((~>) k3 k4)) (TyCon3 k1 k2 k3 k4 f) x Source # | |
type Apply a822083586 (TyFun b822083587 (TyFun c822083588 (TyFun d822083589 (TyFun e822083590 (a822083586, b822083587, c822083588, d822083589, e822083590) -> Type) -> Type) -> Type) -> Type) (Tuple5Sym0 a822083586 b822083587 c822083588 d822083589 e822083590) l0 Source # | |
type Apply b822083587 (TyFun c822083588 (TyFun d822083589 (a822083586, b822083587, c822083588, d822083589) -> Type) -> Type) (Tuple4Sym1 b822083587 c822083588 d822083589 a822083586 l1) l0 Source # | |
type Apply k1 ((~>) k2 ((~>) k3 ((~>) k4 k5))) (TyCon4 k1 k2 k3 k4 k5 f) x Source # | |
type Apply a822083586 (TyFun b822083587 (TyFun c822083588 (TyFun d822083589 (TyFun e822083590 (TyFun f822083591 (a822083586, b822083587, c822083588, d822083589, e822083590, f822083591) -> Type) -> Type) -> Type) -> Type) -> Type) (Tuple6Sym0 a822083586 b822083587 c822083588 d822083589 e822083590 f822083591) l0 Source # | |
type Apply b822083587 (TyFun c822083588 (TyFun d822083589 (TyFun e822083590 (a822083586, b822083587, c822083588, d822083589, e822083590) -> Type) -> Type) -> Type) (Tuple5Sym1 b822083587 c822083588 d822083589 e822083590 a822083586 l1) l0 Source # | |
type Apply c822083588 (TyFun d822083589 (a822083586, b822083587, c822083588, d822083589) -> Type) (Tuple4Sym2 c822083588 d822083589 b822083587 a822083586 l1 l2) l0 Source # | |
type Apply k1 ((~>) k2 ((~>) k3 ((~>) k4 ((~>) k5 k6)))) (TyCon5 k1 k2 k3 k4 k5 k6 f) x Source # | |
type Apply a822083586 (TyFun b822083587 (TyFun c822083588 (TyFun d822083589 (TyFun e822083590 (TyFun f822083591 (TyFun g822083592 (a822083586, b822083587, c822083588, d822083589, e822083590, f822083591, g822083592) -> Type) -> Type) -> Type) -> Type) -> Type) -> Type) (Tuple7Sym0 a822083586 b822083587 c822083588 d822083589 e822083590 f822083591 g822083592) l0 Source # | |
type Apply b822083587 (TyFun c822083588 (TyFun d822083589 (TyFun e822083590 (TyFun f822083591 (a822083586, b822083587, c822083588, d822083589, e822083590, f822083591) -> Type) -> Type) -> Type) -> Type) (Tuple6Sym1 b822083587 c822083588 d822083589 e822083590 f822083591 a822083586 l1) l0 Source # | |
type Apply c822083588 (TyFun d822083589 (TyFun e822083590 (a822083586, b822083587, c822083588, d822083589, e822083590) -> Type) -> Type) (Tuple5Sym2 c822083588 d822083589 e822083590 b822083587 a822083586 l1 l2) l0 Source # | |
type Apply k1 ((~>) k2 ((~>) k3 ((~>) k4 ((~>) k5 ((~>) k6 k7))))) (TyCon6 k1 k2 k3 k4 k5 k6 k7 f) x Source # | |
type Apply b822083587 (TyFun c822083588 (TyFun d822083589 (TyFun e822083590 (TyFun f822083591 (TyFun g822083592 (a822083586, b822083587, c822083588, d822083589, e822083590, f822083591, g822083592) -> Type) -> Type) -> Type) -> Type) -> Type) (Tuple7Sym1 b822083587 c822083588 d822083589 e822083590 f822083591 g822083592 a822083586 l1) l0 Source # | |
type Apply c822083588 (TyFun d822083589 (TyFun e822083590 (TyFun f822083591 (a822083586, b822083587, c822083588, d822083589, e822083590, f822083591) -> Type) -> Type) -> Type) (Tuple6Sym2 c822083588 d822083589 e822083590 f822083591 b822083587 a822083586 l1 l2) l0 Source # | |
type Apply d822083589 (TyFun e822083590 (a822083586, b822083587, c822083588, d822083589, e822083590) -> Type) (Tuple5Sym3 d822083589 e822083590 c822083588 b822083587 a822083586 l1 l2 l3) l0 Source # | |
type Apply k1 ((~>) k2 ((~>) k3 ((~>) k4 ((~>) k5 ((~>) k6 ((~>) k7 k8)))))) (TyCon7 k1 k2 k3 k4 k5 k6 k7 k8 f) x Source # | |
type Apply c822083588 (TyFun d822083589 (TyFun e822083590 (TyFun f822083591 (TyFun g822083592 (a822083586, b822083587, c822083588, d822083589, e822083590, f822083591, g822083592) -> Type) -> Type) -> Type) -> Type) (Tuple7Sym2 c822083588 d822083589 e822083590 f822083591 g822083592 b822083587 a822083586 l1 l2) l0 Source # | |
type Apply d822083589 (TyFun e822083590 (TyFun f822083591 (a822083586, b822083587, c822083588, d822083589, e822083590, f822083591) -> Type) -> Type) (Tuple6Sym3 d822083589 e822083590 f822083591 c822083588 b822083587 a822083586 l1 l2 l3) l0 Source # | |
type Apply k1 ((~>) k2 ((~>) k3 ((~>) k4 ((~>) k5 ((~>) k6 ((~>) k7 ((~>) k8 k9))))))) (TyCon8 k1 k2 k3 k4 k5 k6 k7 k8 k9 f) x Source # | |
type Apply d822083589 (TyFun e822083590 (TyFun f822083591 (TyFun g822083592 (a822083586, b822083587, c822083588, d822083589, e822083590, f822083591, g822083592) -> Type) -> Type) -> Type) (Tuple7Sym3 d822083589 e822083590 f822083591 g822083592 c822083588 b822083587 a822083586 l1 l2 l3) l0 Source # | |
type Apply e822083590 (TyFun f822083591 (a822083586, b822083587, c822083588, d822083589, e822083590, f822083591) -> Type) (Tuple6Sym4 e822083590 f822083591 d822083589 c822083588 b822083587 a822083586 l1 l2 l3 l4) l0 Source # | |
type Apply e822083590 (TyFun f822083591 (TyFun g822083592 (a822083586, b822083587, c822083588, d822083589, e822083590, f822083591, g822083592) -> Type) -> Type) (Tuple7Sym4 e822083590 f822083591 g822083592 d822083589 c822083588 b822083587 a822083586 l1 l2 l3 l4) l0 Source # | |
type Apply f822083591 (TyFun g822083592 (a822083586, b822083587, c822083588, d822083589, e822083590, f822083591, g822083592) -> Type) (Tuple7Sym5 f822083591 g822083592 e822083590 d822083589 c822083588 b822083587 a822083586 l1 l2 l3 l4 l5) l0 Source # | |
type Apply c822083588 (a822083586, b822083587, c822083588) (Tuple3Sym2 c822083588 b822083587 a822083586 l1 l2) l0 Source # | |
type Apply d822083589 (a822083586, b822083587, c822083588, d822083589) (Tuple4Sym3 d822083589 c822083588 b822083587 a822083586 l1 l2 l3) l0 Source # | |
type Apply e822083590 (a822083586, b822083587, c822083588, d822083589, e822083590) (Tuple5Sym4 e822083590 d822083589 c822083588 b822083587 a822083586 l1 l2 l3 l4) l0 Source # | |
type Apply f822083591 (a822083586, b822083587, c822083588, d822083589, e822083590, f822083591) (Tuple6Sym5 f822083591 e822083590 d822083589 c822083588 b822083587 a822083586 l1 l2 l3 l4 l5) l0 Source # | |
type Apply g822083592 (a822083586, b822083587, c822083588, d822083589, e822083590, f822083591, g822083592) (Tuple7Sym6 g822083592 f822083591 e822083590 d822083589 c822083588 b822083587 a822083586 l1 l2 l3 l4 l5 l6) l0 Source # | |
type Apply [Bool] Bool AndSym0 l0 Source # | |
type Apply [Bool] Bool OrSym0 l0 Source # | |
type Apply [a1627953409] a1627953409 (HeadSym0 a1627953409) l0 Source # | |
type Apply [a1627953408] a1627953408 (LastSym0 a1627953408) l0 Source # | |
type Apply [a1627953405] Bool (NullSym0 a1627953405) l0 Source # | |
type Apply [a1627953302] a1627953302 (MinimumSym0 a1627953302) l0 Source # | |
type Apply [a1627953303] a1627953303 (MaximumSym0 a1627953303) l0 Source # | |
type Apply [a1627953294] a1627953294 (SumSym0 a1627953294) l0 Source # | |
type Apply [a1627953293] a1627953293 (ProductSym0 a1627953293) l0 Source # | |
type Apply [a1627953292] Nat (LengthSym0 a1627953292) l0 Source # | |
type Apply (Maybe a1627849036) Bool (IsJustSym0 a1627849036) l0 Source # | |
type Apply (Maybe a1627849035) Bool (IsNothingSym0 a1627849035) l0 Source # | |
type Apply (Maybe a1627849034) a1627849034 (FromJustSym0 a1627849034) l0 Source # | |
type Apply [a1627942712] Bool (Any_Sym1 a1627942712 l1) l0 Source # | |
type Apply [a1627953371] Bool (IsSuffixOfSym1 a1627953371 l1) l0 Source # | |
type Apply [a1627953394] a1627953394 (Foldl1'Sym1 a1627953394 l1) l0 Source # | |
type Apply [a1627953321] a1627953321 (MinimumBySym1 a1627953321 l1) l0 Source # | |
type Apply [a1627953322] a1627953322 (MaximumBySym1 a1627953322 l1) l0 Source # | |
type Apply [a1627953395] a1627953395 (Foldl1Sym1 a1627953395 l1) l0 Source # | |
type Apply [a1627953393] a1627953393 (Foldr1Sym1 a1627953393 l1) l0 Source # | |
type Apply [a1627953389] Bool (AllSym1 a1627953389 l1) l0 Source # | |
type Apply [a1627953370] Bool (IsInfixOfSym1 a1627953370 l1) l0 Source # | |
type Apply [a1627953372] Bool (IsPrefixOfSym1 a1627953372 l1) l0 Source # | |
type Apply [a1627953369] Bool (ElemSym1 a1627953369 l1) l0 Source # | |
type Apply [a1627953368] Bool (NotElemSym1 a1627953368 l1) l0 Source # | |
type Apply [a1627953283] k2 (GenericLengthSym0 a1627953283 k2) l0 Source # | |
type Apply (Maybe a1627849033) a1627849033 (FromMaybeSym1 a1627849033 l1) l0 Source # | |
type Apply [a1627619912] b1627619913 (FoldlSym2 a1627619912 b1627619913 l1 l2) l0 Source # | |
type Apply [a1627796657] b1627796658 (FoldrSym2 a1627796657 b1627796658 l1 l2) l0 Source # | |
type Apply [a1627953396] b1627953397 (Foldl'Sym2 a1627953396 b1627953397 l1 l2) l0 Source # | |
type Apply (Maybe a1627847772) b1627847771 (Maybe_Sym2 a1627847772 b1627847771 l1 l2) l0 Source # | |
type Apply [[a1627953290]] [[a1627953290]] (TransposeSym0 a1627953290) l0 Source # | |
type Apply [[a1627953392]] [a1627953392] (ConcatSym0 a1627953392) l0 Source # | |
type Apply [Maybe a1627849030] [a1627849030] (CatMaybesSym0 a1627849030) l0 Source # | |
type Apply [a1627849031] (Maybe a1627849031) (ListToMaybeSym0 a1627849031) l0 Source # | |
type Apply [a1627953407] [a1627953407] (TailSym0 a1627953407) l0 Source # | |
type Apply [a1627953406] [a1627953406] (InitSym0 a1627953406) l0 Source # | |
type Apply [a1627953404] [a1627953404] (ReverseSym0 a1627953404) l0 Source # | |
type Apply [a1627953401] [[a1627953401]] (SubsequencesSym0 a1627953401) l0 Source # | |
type Apply [a1627953398] [[a1627953398]] (PermutationsSym0 a1627953398) l0 Source # | |
type Apply [a1627953374] [[a1627953374]] (InitsSym0 a1627953374) l0 Source # | |
type Apply [a1627953373] [[a1627953373]] (TailsSym0 a1627953373) l0 Source # | |
type Apply [a1627953288] [a1627953288] (NubSym0 a1627953288) l0 Source # | |
type Apply [a1627953300] [a1627953300] (SortSym0 a1627953300) l0 Source # | |
type Apply [a1627953304] [[a1627953304]] (GroupSym0 a1627953304) l0 Source # | |
type Apply (Maybe a1627849032) [a1627849032] (MaybeToListSym0 a1627849032) l0 Source # | |
type Apply [[a1627953402]] [a1627953402] (IntercalateSym1 a1627953402 l1) l0 Source # | |
type Apply [Either a1627830454 b1627830455] [a1627830454] (LeftsSym0 b1627830455 a1627830454) l0 Source # | |
type Apply [Either a1627830452 b1627830453] [b1627830453] (RightsSym0 a1627830452 b1627830453) l0 Source # | |
type Apply [a822083586] [a822083586] ((:$$) a822083586 l1) l0 Source # | |
type Apply [a1627796654] [a1627796654] ((:++$$) a1627796654 l1) l0 Source # | |
type Apply [a1627953310] [a1627953310] (DropWhileEndSym1 a1627953310 l1) l0 Source # | |
type Apply [a1627953403] [a1627953403] (IntersperseSym1 a1627953403 l1) l0 Source # | |
type Apply [a1627953386] [a1627953386] (Scanl1Sym1 a1627953386 l1) l0 Source # | |
type Apply [a1627953383] [a1627953383] (Scanr1Sym1 a1627953383 l1) l0 Source # | |
type Apply [a1627953318] (Maybe Nat) (ElemIndexSym1 a1627953318 l1) l0 Source # | |
type Apply [a1627953316] (Maybe Nat) (FindIndexSym1 a1627953316 l1) l0 Source # | |
type Apply [a1627953317] [Nat] (ElemIndicesSym1 a1627953317 l1) l0 Source # | |
type Apply [a1627953315] [Nat] (FindIndicesSym1 a1627953315 l1) l0 Source # | |
type Apply [a1627953327] [a1627953327] ((:\\$$) a1627953327 l1) l0 Source # | |
type Apply [a1627953328] [a1627953328] (DeleteSym1 a1627953328 l1) l0 Source # | |
type Apply [a1627953284] [a1627953284] (UnionSym1 a1627953284 l1) l0 Source # | |
type Apply [a1627953324] [a1627953324] (SortBySym1 a1627953324 l1) l0 Source # | |
type Apply [a1627953301] [a1627953301] (InsertSym1 a1627953301 l1) l0 Source # | |
type Apply [a1627953314] [a1627953314] (IntersectSym1 a1627953314 l1) l0 Source # | |
type Apply [a1627953319] (Maybe a1627953319) (FindSym1 a1627953319 l1) l0 Source # | |
type Apply [a1627953320] [a1627953320] (FilterSym1 a1627953320 l1) l0 Source # | |
type Apply [a1627953312] [a1627953312] (TakeWhileSym1 a1627953312 l1) l0 Source # | |
type Apply [a1627953311] [a1627953311] (DropWhileSym1 a1627953311 l1) l0 Source # | |
type Apply [a1627953299] [[a1627953299]] (GroupBySym1 a1627953299 l1) l0 Source # | |
type Apply [a1627953307] [a1627953307] (TakeSym1 a1627953307 l1) l0 Source # | |
type Apply [a1627953306] [a1627953306] (DropSym1 a1627953306 l1) l0 Source # | |
type Apply [a1627953287] [a1627953287] (NubBySym1 a1627953287 l1) l0 Source # | |
type Apply [a1628251687] (Maybe [a1628251687]) (StripPrefixSym1 a1628251687 l1) l0 Source # | |
type Apply [(a1627953297, b1627953298)] (Maybe b1627953298) (LookupSym1 b1627953298 a1627953297 l1) l0 Source # | |
type Apply [a1627796655] [b1627796656] (MapSym1 a1627796655 b1627796656 l1) l0 Source # | |
type Apply [a1627849028] [b1627849029] (MapMaybeSym1 a1627849028 b1627849029 l1) l0 Source # | |
type Apply [a1627953390] [b1627953391] (ConcatMapSym1 a1627953390 b1627953391 l1) l0 Source # | |
type Apply [b1627953367] [(a1627953366, b1627953367)] (ZipSym1 b1627953367 a1627953366 l1) l0 Source # | |
type Apply [a1627953285] [a1627953285] (UnionBySym2 a1627953285 l1 l2) l0 Source # | |
type Apply [a1627953325] [a1627953325] (DeleteFirstsBySym2 a1627953325 l1 l2) l0 Source # | |
type Apply [a1627953326] [a1627953326] (DeleteBySym2 a1627953326 l1 l2) l0 Source # | |
type Apply [a1627953323] [a1627953323] (InsertBySym2 a1627953323 l1 l2) l0 Source # | |
type Apply [a1627953313] [a1627953313] (IntersectBySym2 a1627953313 l1 l2) l0 Source # | |
type Apply [a1628251638] [a1628251638] (GenericTakeSym1 a1628251638 i1628251637 l1) l0 Source # | |
type Apply [a1628251636] [a1628251636] (GenericDropSym1 a1628251636 i1628251635 l1) l0 Source # | |
type Apply [a1627953388] [b1627953387] (ScanlSym2 a1627953388 b1627953387 l1 l2) l0 Source # | |
type Apply [a1627953384] [b1627953385] (ScanrSym2 a1627953384 b1627953385 l1 l2) l0 Source # | |
type Apply [c1627953365] [(a1627953363, b1627953364, c1627953365)] (Zip3Sym2 c1627953365 b1627953364 a1627953363 l1 l2) l0 Source # | |
type Apply [b1627953361] [c1627953362] (ZipWithSym2 a1627953360 b1627953361 c1627953362 l1 l2) l0 Source # | |
type Apply [c1627953358] [d1627953359] (ZipWith3Sym3 a1627953356 b1627953357 c1627953358 d1627953359 l1 l2 l3) l0 Source # | |
type Apply [d1628251686] [(a1628251683, b1628251684, c1628251685, d1628251686)] (Zip4Sym3 d1628251686 c1628251685 b1628251684 a1628251683 l1 l2 l3) l0 Source # | |
type Apply [e1628251682] [(a1628251678, b1628251679, c1628251680, d1628251681, e1628251682)] (Zip5Sym4 e1628251682 d1628251681 c1628251680 b1628251679 a1628251678 l1 l2 l3 l4) l0 Source # | |
type Apply [d1628251663] [e1628251664] (ZipWith4Sym4 a1628251660 b1628251661 c1628251662 d1628251663 e1628251664 l1 l2 l3 l4) l0 Source # | |
type Apply [f1628251677] [(a1628251672, b1628251673, c1628251674, d1628251675, e1628251676, f1628251677)] (Zip6Sym5 f1628251677 e1628251676 d1628251675 c1628251674 b1628251673 a1628251672 l1 l2 l3 l4 l5) l0 Source # | |
type Apply [e1628251658] [f1628251659] (ZipWith5Sym5 a1628251654 b1628251655 c1628251656 d1628251657 e1628251658 f1628251659 l1 l2 l3 l4 l5) l0 Source # | |
type Apply [g1628251671] [(a1628251665, b1628251666, c1628251667, d1628251668, e1628251669, f1628251670, g1628251671)] (Zip7Sym6 g1628251671 f1628251670 e1628251669 d1628251668 c1628251667 b1628251666 a1628251665 l1 l2 l3 l4 l5 l6) l0 Source # | |
type Apply [f1628251652] [g1628251653] (ZipWith6Sym6 a1628251647 b1628251648 c1628251649 d1628251650 e1628251651 f1628251652 g1628251653 l1 l2 l3 l4 l5 l6) l0 Source # | |
type Apply [g1628251645] [h1628251646] (ZipWith7Sym7 a1628251639 b1628251640 c1628251641 d1628251642 e1628251643 f1628251644 g1628251645 h1628251646 l1 l2 l3 l4 l5 l6 l7) l0 Source # | |
type Apply [a1627796654] (TyFun [a1627796654] [a1627796654] -> Type) ((:++$) a1627796654) l0 Source # | |
type Apply [a1627953371] (TyFun [a1627953371] Bool -> Type) (IsSuffixOfSym0 a1627953371) l0 Source # | |
type Apply [a1627953402] (TyFun [[a1627953402]] [a1627953402] -> Type) (IntercalateSym0 a1627953402) l0 Source # | |
type Apply [a1627953370] (TyFun [a1627953370] Bool -> Type) (IsInfixOfSym0 a1627953370) l0 Source # | |
type Apply [a1627953372] (TyFun [a1627953372] Bool -> Type) (IsPrefixOfSym0 a1627953372) l0 Source # | |
type Apply [a1627953327] (TyFun [a1627953327] [a1627953327] -> Type) ((:\\$) a1627953327) l0 Source # | |
type Apply [a1627953284] (TyFun [a1627953284] [a1627953284] -> Type) (UnionSym0 a1627953284) l0 Source # | |
type Apply [a1627953314] (TyFun [a1627953314] [a1627953314] -> Type) (IntersectSym0 a1627953314) l0 Source # | |
type Apply [a1627953289] (TyFun Nat a1627953289 -> Type) ((:!!$) a1627953289) l0 Source # | |
type Apply [a1628251687] (TyFun [a1628251687] (Maybe [a1628251687]) -> Type) (StripPrefixSym0 a1628251687) l0 Source # | |
type Apply [(a1627953354, b1627953355)] ([a1627953354], [b1627953355]) (UnzipSym0 a1627953354 b1627953355) l0 Source # | |
type Apply [a1627953366] (TyFun [b1627953367] [(a1627953366, b1627953367)] -> Type) (ZipSym0 a1627953366 b1627953367) l0 Source # | |
type Apply [a1627953285] (TyFun [a1627953285] [a1627953285] -> Type) (UnionBySym1 a1627953285 l1) l0 Source # | |
type Apply [a1627953325] (TyFun [a1627953325] [a1627953325] -> Type) (DeleteFirstsBySym1 a1627953325 l1) l0 Source # | |
type Apply [a1627953313] (TyFun [a1627953313] [a1627953313] -> Type) (IntersectBySym1 a1627953313 l1) l0 Source # | |
type Apply [a1627953309] ([a1627953309], [a1627953309]) (SpanSym1 a1627953309 l1) l0 Source # | |
type Apply [a1627953308] ([a1627953308], [a1627953308]) (BreakSym1 a1627953308 l1) l0 Source # | |
type Apply [a1627953305] ([a1627953305], [a1627953305]) (SplitAtSym1 a1627953305 l1) l0 Source # | |
type Apply [a1627953296] ([a1627953296], [a1627953296]) (PartitionSym1 a1627953296 l1) l0 Source # | |
type Apply [a1628251632] (TyFun i1628251631 a1628251632 -> Type) (GenericIndexSym0 i1628251631 a1628251632) l0 Source # | |
type Apply [a1627953363] (TyFun [b1627953364] (TyFun [c1627953365] [(a1627953363, b1627953364, c1627953365)] -> Type) -> Type) (Zip3Sym0 a1627953363 b1627953364 c1627953365) l0 Source # | |
type Apply [a1628251634] ([a1628251634], [a1628251634]) (GenericSplitAtSym1 a1628251634 i1628251633 l1) l0 Source # | |
type Apply [b1627953364] (TyFun [c1627953365] [(a1627953363, b1627953364, c1627953365)] -> Type) (Zip3Sym1 b1627953364 c1627953365 a1627953363 l1) l0 Source # | |
type Apply [a1627953360] (TyFun [b1627953361] [c1627953362] -> Type) (ZipWithSym1 a1627953360 b1627953361 c1627953362 l1) l0 Source # | |
type Apply [a1628251683] (TyFun [b1628251684] (TyFun [c1628251685] (TyFun [d1628251686] [(a1628251683, b1628251684, c1628251685, d1628251686)] -> Type) -> Type) -> Type) (Zip4Sym0 a1628251683 b1628251684 c1628251685 d1628251686) l0 Source # | |
type Apply [x1627953381] (acc1627953380, [y1627953382]) (MapAccumLSym2 x1627953381 acc1627953380 y1627953382 l1 l2) l0 Source # | |
type Apply [x1627953378] (acc1627953377, [y1627953379]) (MapAccumRSym2 x1627953378 acc1627953377 y1627953379 l1 l2) l0 Source # | |
type Apply [a1627953356] (TyFun [b1627953357] (TyFun [c1627953358] [d1627953359] -> Type) -> Type) (ZipWith3Sym1 a1627953356 b1627953357 c1627953358 d1627953359 l1) l0 Source # | |
type Apply [b1628251684] (TyFun [c1628251685] (TyFun [d1628251686] [(a1628251683, b1628251684, c1628251685, d1628251686)] -> Type) -> Type) (Zip4Sym1 b1628251684 c1628251685 d1628251686 a1628251683 l1) l0 Source # | |
type Apply [a1628251678] (TyFun [b1628251679] (TyFun [c1628251680] (TyFun [d1628251681] (TyFun [e1628251682] [(a1628251678, b1628251679, c1628251680, d1628251681, e1628251682)] -> Type) -> Type) -> Type) -> Type) (Zip5Sym0 a1628251678 b1628251679 c1628251680 d1628251681 e1628251682) l0 Source # | |
type Apply [b1627953357] (TyFun [c1627953358] [d1627953359] -> Type) (ZipWith3Sym2 a1627953356 b1627953357 c1627953358 d1627953359 l1 l2) l0 Source # | |
type Apply [c1628251685] (TyFun [d1628251686] [(a1628251683, b1628251684, c1628251685, d1628251686)] -> Type) (Zip4Sym2 c1628251685 d1628251686 b1628251684 a1628251683 l1 l2) l0 Source # | |
type Apply [b1628251679] (TyFun [c1628251680] (TyFun [d1628251681] (TyFun [e1628251682] [(a1628251678, b1628251679, c1628251680, d1628251681, e1628251682)] -> Type) -> Type) -> Type) (Zip5Sym1 b1628251679 c1628251680 d1628251681 e1628251682 a1628251678 l1) l0 Source # | |
type Apply [a1628251672] (TyFun [b1628251673] (TyFun [c1628251674] (TyFun [d1628251675] (TyFun [e1628251676] (TyFun [f1628251677] [(a1628251672, b1628251673, c1628251674, d1628251675, e1628251676, f1628251677)] -> Type) -> Type) -> Type) -> Type) -> Type) (Zip6Sym0 a1628251672 b1628251673 c1628251674 d1628251675 e1628251676 f1628251677) l0 Source # | |
type Apply [a1628251660] (TyFun [b1628251661] (TyFun [c1628251662] (TyFun [d1628251663] [e1628251664] -> Type) -> Type) -> Type) (ZipWith4Sym1 a1628251660 b1628251661 c1628251662 d1628251663 e1628251664 l1) l0 Source # | |
type Apply [c1628251680] (TyFun [d1628251681] (TyFun [e1628251682] [(a1628251678, b1628251679, c1628251680, d1628251681, e1628251682)] -> Type) -> Type) (Zip5Sym2 c1628251680 d1628251681 e1628251682 b1628251679 a1628251678 l1 l2) l0 Source # | |
type Apply [b1628251673] (TyFun [c1628251674] (TyFun [d1628251675] (TyFun [e1628251676] (TyFun [f1628251677] [(a1628251672, b1628251673, c1628251674, d1628251675, e1628251676, f1628251677)] -> Type) -> Type) -> Type) -> Type) (Zip6Sym1 b1628251673 c1628251674 d1628251675 e1628251676 f1628251677 a1628251672 l1) l0 Source # | |
type Apply [a1628251665] (TyFun [b1628251666] (TyFun [c1628251667] (TyFun [d1628251668] (TyFun [e1628251669] (TyFun [f1628251670] (TyFun [g1628251671] [(a1628251665, b1628251666, c1628251667, d1628251668, e1628251669, f1628251670, g1628251671)] -> Type) -> Type) -> Type) -> Type) -> Type) -> Type) (Zip7Sym0 a1628251665 b1628251666 c1628251667 d1628251668 e1628251669 f1628251670 g1628251671) l0 Source # | |
type Apply [b1628251661] (TyFun [c1628251662] (TyFun [d1628251663] [e1628251664] -> Type) -> Type) (ZipWith4Sym2 a1628251660 b1628251661 c1628251662 d1628251663 e1628251664 l1 l2) l0 Source # | |
type Apply [a1628251654] (TyFun [b1628251655] (TyFun [c1628251656] (TyFun [d1628251657] (TyFun [e1628251658] [f1628251659] -> Type) -> Type) -> Type) -> Type) (ZipWith5Sym1 a1628251654 b1628251655 c1628251656 d1628251657 e1628251658 f1628251659 l1) l0 Source # | |
type Apply [d1628251681] (TyFun [e1628251682] [(a1628251678, b1628251679, c1628251680, d1628251681, e1628251682)] -> Type) (Zip5Sym3 d1628251681 e1628251682 c1628251680 b1628251679 a1628251678 l1 l2 l3) l0 Source # | |
type Apply [c1628251674] (TyFun [d1628251675] (TyFun [e1628251676] (TyFun [f1628251677] [(a1628251672, b1628251673, c1628251674, d1628251675, e1628251676, f1628251677)] -> Type) -> Type) -> Type) (Zip6Sym2 c1628251674 d1628251675 e1628251676 f1628251677 b1628251673 a1628251672 l1 l2) l0 Source # | |
type Apply [b1628251666] (TyFun [c1628251667] (TyFun [d1628251668] (TyFun [e1628251669] (TyFun [f1628251670] (TyFun [g1628251671] [(a1628251665, b1628251666, c1628251667, d1628251668, e1628251669, f1628251670, g1628251671)] -> Type) -> Type) -> Type) -> Type) -> Type) (Zip7Sym1 b1628251666 c1628251667 d1628251668 e1628251669 f1628251670 g1628251671 a1628251665 l1) l0 Source # | |
type Apply [c1628251662] (TyFun [d1628251663] [e1628251664] -> Type) (ZipWith4Sym3 a1628251660 b1628251661 c1628251662 d1628251663 e1628251664 l1 l2 l3) l0 Source # | |
type Apply [b1628251655] (TyFun [c1628251656] (TyFun [d1628251657] (TyFun [e1628251658] [f1628251659] -> Type) -> Type) -> Type) (ZipWith5Sym2 a1628251654 b1628251655 c1628251656 d1628251657 e1628251658 f1628251659 l1 l2) l0 Source # | |
type Apply [a1628251647] (TyFun [b1628251648] (TyFun [c1628251649] (TyFun [d1628251650] (TyFun [e1628251651] (TyFun [f1628251652] [g1628251653] -> Type) -> Type) -> Type) -> Type) -> Type) (ZipWith6Sym1 a1628251647 b1628251648 c1628251649 d1628251650 e1628251651 f1628251652 g1628251653 l1) l0 Source # | |
type Apply [d1628251675] (TyFun [e1628251676] (TyFun [f1628251677] [(a1628251672, b1628251673, c1628251674, d1628251675, e1628251676, f1628251677)] -> Type) -> Type) (Zip6Sym3 d1628251675 e1628251676 f1628251677 c1628251674 b1628251673 a1628251672 l1 l2 l3) l0 Source # | |
type Apply [c1628251667] (TyFun [d1628251668] (TyFun [e1628251669] (TyFun [f1628251670] (TyFun [g1628251671] [(a1628251665, b1628251666, c1628251667, d1628251668, e1628251669, f1628251670, g1628251671)] -> Type) -> Type) -> Type) -> Type) (Zip7Sym2 c1628251667 d1628251668 e1628251669 f1628251670 g1628251671 b1628251666 a1628251665 l1 l2) l0 Source # | |
type Apply [c1628251656] (TyFun [d1628251657] (TyFun [e1628251658] [f1628251659] -> Type) -> Type) (ZipWith5Sym3 a1628251654 b1628251655 c1628251656 d1628251657 e1628251658 f1628251659 l1 l2 l3) l0 Source # | |
type Apply [b1628251648] (TyFun [c1628251649] (TyFun [d1628251650] (TyFun [e1628251651] (TyFun [f1628251652] [g1628251653] -> Type) -> Type) -> Type) -> Type) (ZipWith6Sym2 a1628251647 b1628251648 c1628251649 d1628251650 e1628251651 f1628251652 g1628251653 l1 l2) l0 Source # | |
type Apply [a1628251639] (TyFun [b1628251640] (TyFun [c1628251641] (TyFun [d1628251642] (TyFun [e1628251643] (TyFun [f1628251644] (TyFun [g1628251645] [h1628251646] -> Type) -> Type) -> Type) -> Type) -> Type) -> Type) (ZipWith7Sym1 a1628251639 b1628251640 c1628251641 d1628251642 e1628251643 f1628251644 g1628251645 h1628251646 l1) l0 Source # | |
type Apply [e1628251676] (TyFun [f1628251677] [(a1628251672, b1628251673, c1628251674, d1628251675, e1628251676, f1628251677)] -> Type) (Zip6Sym4 e1628251676 f1628251677 d1628251675 c1628251674 b1628251673 a1628251672 l1 l2 l3 l4) l0 Source # | |
type Apply [d1628251668] (TyFun [e1628251669] (TyFun [f1628251670] (TyFun [g1628251671] [(a1628251665, b1628251666, c1628251667, d1628251668, e1628251669, f1628251670, g1628251671)] -> Type) -> Type) -> Type) (Zip7Sym3 d1628251668 e1628251669 f1628251670 g1628251671 c1628251667 b1628251666 a1628251665 l1 l2 l3) l0 Source # | |
type Apply [d1628251657] (TyFun [e1628251658] [f1628251659] -> Type) (ZipWith5Sym4 a1628251654 b1628251655 c1628251656 d1628251657 e1628251658 f1628251659 l1 l2 l3 l4) l0 Source # | |
type Apply [c1628251649] (TyFun [d1628251650] (TyFun [e1628251651] (TyFun [f1628251652] [g1628251653] -> Type) -> Type) -> Type) (ZipWith6Sym3 a1628251647 b1628251648 c1628251649 d1628251650 e1628251651 f1628251652 g1628251653 l1 l2 l3) l0 Source # | |
type Apply [b1628251640] (TyFun [c1628251641] (TyFun [d1628251642] (TyFun [e1628251643] (TyFun [f1628251644] (TyFun [g1628251645] [h1628251646] -> Type) -> Type) -> Type) -> Type) -> Type) (ZipWith7Sym2 a1628251639 b1628251640 c1628251641 d1628251642 e1628251643 f1628251644 g1628251645 h1628251646 l1 l2) l0 Source # | |
type Apply [e1628251669] (TyFun [f1628251670] (TyFun [g1628251671] [(a1628251665, b1628251666, c1628251667, d1628251668, e1628251669, f1628251670, g1628251671)] -> Type) -> Type) (Zip7Sym4 e1628251669 f1628251670 g1628251671 d1628251668 c1628251667 b1628251666 a1628251665 l1 l2 l3 l4) l0 Source # | |
type Apply [d1628251650] (TyFun [e1628251651] (TyFun [f1628251652] [g1628251653] -> Type) -> Type) (ZipWith6Sym4 a1628251647 b1628251648 c1628251649 d1628251650 e1628251651 f1628251652 g1628251653 l1 l2 l3 l4) l0 Source # | |
type Apply [c1628251641] (TyFun [d1628251642] (TyFun [e1628251643] (TyFun [f1628251644] (TyFun [g1628251645] [h1628251646] -> Type) -> Type) -> Type) -> Type) (ZipWith7Sym3 a1628251639 b1628251640 c1628251641 d1628251642 e1628251643 f1628251644 g1628251645 h1628251646 l1 l2 l3) l0 Source # | |
type Apply [f1628251670] (TyFun [g1628251671] [(a1628251665, b1628251666, c1628251667, d1628251668, e1628251669, f1628251670, g1628251671)] -> Type) (Zip7Sym5 f1628251670 g1628251671 e1628251669 d1628251668 c1628251667 b1628251666 a1628251665 l1 l2 l3 l4 l5) l0 Source # | |
type Apply [e1628251651] (TyFun [f1628251652] [g1628251653] -> Type) (ZipWith6Sym5 a1628251647 b1628251648 c1628251649 d1628251650 e1628251651 f1628251652 g1628251653 l1 l2 l3 l4 l5) l0 Source # | |
type Apply [d1628251642] (TyFun [e1628251643] (TyFun [f1628251644] (TyFun [g1628251645] [h1628251646] -> Type) -> Type) -> Type) (ZipWith7Sym4 a1628251639 b1628251640 c1628251641 d1628251642 e1628251643 f1628251644 g1628251645 h1628251646 l1 l2 l3 l4) l0 Source # | |
type Apply [e1628251643] (TyFun [f1628251644] (TyFun [g1628251645] [h1628251646] -> Type) -> Type) (ZipWith7Sym5 a1628251639 b1628251640 c1628251641 d1628251642 e1628251643 f1628251644 g1628251645 h1628251646 l1 l2 l3 l4 l5) l0 Source # | |
type Apply [f1628251644] (TyFun [g1628251645] [h1628251646] -> Type) (ZipWith7Sym6 a1628251639 b1628251640 c1628251641 d1628251642 e1628251643 f1628251644 g1628251645 h1628251646 l1 l2 l3 l4 l5 l6) l0 Source # | |
type Apply [(a1627953351, b1627953352, c1627953353)] ([a1627953351], [b1627953352], [c1627953353]) (Unzip3Sym0 a1627953351 b1627953352 c1627953353) l0 Source # | |
type Apply [(a1627953347, b1627953348, c1627953349, d1627953350)] ([a1627953347], [b1627953348], [c1627953349], [d1627953350]) (Unzip4Sym0 a1627953347 b1627953348 c1627953349 d1627953350) l0 Source # | |
type Apply [(a1627953342, b1627953343, c1627953344, d1627953345, e1627953346)] ([a1627953342], [b1627953343], [c1627953344], [d1627953345], [e1627953346]) (Unzip5Sym0 a1627953342 b1627953343 c1627953344 d1627953345 e1627953346) l0 Source # | |
type Apply [(a1627953336, b1627953337, c1627953338, d1627953339, e1627953340, f1627953341)] ([a1627953336], [b1627953337], [c1627953338], [d1627953339], [e1627953340], [f1627953341]) (Unzip6Sym0 a1627953336 b1627953337 c1627953338 d1627953339 e1627953340 f1627953341) l0 Source # | |
type Apply [(a1627953329, b1627953330, c1627953331, d1627953332, e1627953333, f1627953334, g1627953335)] ([a1627953329], [b1627953330], [c1627953331], [d1627953332], [e1627953333], [f1627953334], [g1627953335]) (Unzip7Sym0 a1627953329 b1627953330 c1627953331 d1627953332 e1627953333 f1627953334 g1627953335) l0 Source # | |
type Apply (Either a1627830448 b1627830449) Bool (IsLeftSym0 a1627830448 b1627830449) l0 Source # | |
type Apply (Either a1627830446 b1627830447) Bool (IsRightSym0 a1627830446 b1627830447) l0 Source # | |
type Apply (a1627840729, b1627840730) a1627840729 (FstSym0 b1627840730 a1627840729) l0 Source # | |
type Apply (a1627840727, b1627840728) b1627840728 (SndSym0 a1627840727 b1627840728) l0 Source # | |
type Apply (a1627840721, b1627840722) c1627840723 (UncurrySym1 a1627840721 b1627840722 c1627840723 l1) l0 Source # | |
type Apply (Either a1627829180 b1627829182) c1627829181 (Either_Sym2 b1627829182 a1627829180 c1627829181 l1 l2) l0 Source # | |
type Apply (TyFun a1627845465 Bool -> Type) (TyFun (TyFun a1627845465 a1627845465 -> Type) (TyFun a1627845465 a1627845465 -> Type) -> Type) (UntilSym0 a1627845465) l0 Source # | |
type Apply (TyFun a1627942712 Bool -> Type) (TyFun [a1627942712] Bool -> Type) (Any_Sym0 a1627942712) l0 Source # | |
type Apply (TyFun a1627953310 Bool -> Type) (TyFun [a1627953310] [a1627953310] -> Type) (DropWhileEndSym0 a1627953310) l0 Source # | |
type Apply (TyFun a1627953394 (TyFun a1627953394 a1627953394 -> Type) -> Type) (TyFun [a1627953394] a1627953394 -> Type) (Foldl1'Sym0 a1627953394) l0 Source # | |
type Apply (TyFun a1627953321 (TyFun a1627953321 Ordering -> Type) -> Type) (TyFun [a1627953321] a1627953321 -> Type) (MinimumBySym0 a1627953321) l0 Source # | |
type Apply (TyFun a1627953322 (TyFun a1627953322 Ordering -> Type) -> Type) (TyFun [a1627953322] a1627953322 -> Type) (MaximumBySym0 a1627953322) l0 Source # | |
type Apply (TyFun a1627953395 (TyFun a1627953395 a1627953395 -> Type) -> Type) (TyFun [a1627953395] a1627953395 -> Type) (Foldl1Sym0 a1627953395) l0 Source # | |
type Apply (TyFun a1627953393 (TyFun a1627953393 a1627953393 -> Type) -> Type) (TyFun [a1627953393] a1627953393 -> Type) (Foldr1Sym0 a1627953393) l0 Source # | |
type Apply (TyFun a1627953389 Bool -> Type) (TyFun [a1627953389] Bool -> Type) (AllSym0 a1627953389) l0 Source # | |
type Apply (TyFun a1627953386 (TyFun a1627953386 a1627953386 -> Type) -> Type) (TyFun [a1627953386] [a1627953386] -> Type) (Scanl1Sym0 a1627953386) l0 Source # | |
type Apply (TyFun a1627953383 (TyFun a1627953383 a1627953383 -> Type) -> Type) (TyFun [a1627953383] [a1627953383] -> Type) (Scanr1Sym0 a1627953383) l0 Source # | |
type Apply (TyFun a1627953316 Bool -> Type) (TyFun [a1627953316] (Maybe Nat) -> Type) (FindIndexSym0 a1627953316) l0 Source # | |
type Apply (TyFun a1627953315 Bool -> Type) (TyFun [a1627953315] [Nat] -> Type) (FindIndicesSym0 a1627953315) l0 Source # | |
type Apply (TyFun a1627953285 (TyFun a1627953285 Bool -> Type) -> Type) (TyFun [a1627953285] (TyFun [a1627953285] [a1627953285] -> Type) -> Type) (UnionBySym0 a1627953285) l0 Source # | |
type Apply (TyFun a1627953325 (TyFun a1627953325 Bool -> Type) -> Type) (TyFun [a1627953325] (TyFun [a1627953325] [a1627953325] -> Type) -> Type) (DeleteFirstsBySym0 a1627953325) l0 Source # | |
type Apply (TyFun a1627953326 (TyFun a1627953326 Bool -> Type) -> Type) (TyFun a1627953326 (TyFun [a1627953326] [a1627953326] -> Type) -> Type) (DeleteBySym0 a1627953326) l0 Source # | |
type Apply (TyFun a1627953324 (TyFun a1627953324 Ordering -> Type) -> Type) (TyFun [a1627953324] [a1627953324] -> Type) (SortBySym0 a1627953324) l0 Source # | |
type Apply (TyFun a1627953323 (TyFun a1627953323 Ordering -> Type) -> Type) (TyFun a1627953323 (TyFun [a1627953323] [a1627953323] -> Type) -> Type) (InsertBySym0 a1627953323) l0 Source # | |
type Apply (TyFun a1627953313 (TyFun a1627953313 Bool -> Type) -> Type) (TyFun [a1627953313] (TyFun [a1627953313] [a1627953313] -> Type) -> Type) (IntersectBySym0 a1627953313) l0 Source # | |
type Apply (TyFun a1627953319 Bool -> Type) (TyFun [a1627953319] (Maybe a1627953319) -> Type) (FindSym0 a1627953319) l0 Source # | |
type Apply (TyFun a1627953320 Bool -> Type) (TyFun [a1627953320] [a1627953320] -> Type) (FilterSym0 a1627953320) l0 Source # | |
type Apply (TyFun a1627953312 Bool -> Type) (TyFun [a1627953312] [a1627953312] -> Type) (TakeWhileSym0 a1627953312) l0 Source # | |
type Apply (TyFun a1627953311 Bool -> Type) (TyFun [a1627953311] [a1627953311] -> Type) (DropWhileSym0 a1627953311) l0 Source # | |
type Apply (TyFun a1627953299 (TyFun a1627953299 Bool -> Type) -> Type) (TyFun [a1627953299] [[a1627953299]] -> Type) (GroupBySym0 a1627953299) l0 Source # | |
type Apply (TyFun a1627953309 Bool -> Type) (TyFun [a1627953309] ([a1627953309], [a1627953309]) -> Type) (SpanSym0 a1627953309) l0 Source # | |
type Apply (TyFun a1627953308 Bool -> Type) (TyFun [a1627953308] ([a1627953308], [a1627953308]) -> Type) (BreakSym0 a1627953308) l0 Source # | |
type Apply (TyFun a1627953296 Bool -> Type) (TyFun [a1627953296] ([a1627953296], [a1627953296]) -> Type) (PartitionSym0 a1627953296) l0 Source # | |
type Apply (TyFun a1627953287 (TyFun a1627953287 Bool -> Type) -> Type) (TyFun [a1627953287] [a1627953287] -> Type) (NubBySym0 a1627953287) l0 Source # | |
type Apply (TyFun b1627619913 (TyFun a1627619912 b1627619913 -> Type) -> Type) (TyFun b1627619913 (TyFun [a1627619912] b1627619913 -> Type) -> Type) (FoldlSym0 a1627619912 b1627619913) l0 Source # | |
type Apply (TyFun a b -> *) (TyFun a b -> *) (($!$) a b) arg Source # | |
type Apply (TyFun a b -> *) (TyFun a b -> *) (($$) a b) arg Source # | |
type Apply (TyFun a1627796657 (TyFun b1627796658 b1627796658 -> Type) -> Type) (TyFun b1627796658 (TyFun [a1627796657] b1627796658 -> Type) -> Type) (FoldrSym0 a1627796657 b1627796658) l0 Source # | |
type Apply (TyFun a1627796655 b1627796656 -> Type) (TyFun [a1627796655] [b1627796656] -> Type) (MapSym0 a1627796655 b1627796656) l0 Source # | |
type Apply (TyFun a1627845465 a1627845465 -> Type) (TyFun a1627845465 a1627845465 -> Type) (UntilSym1 a1627845465 l1) l0 Source # | |
type Apply (TyFun a1627849028 (Maybe b1627849029) -> Type) (TyFun [a1627849028] [b1627849029] -> Type) (MapMaybeSym0 a1627849028 b1627849029) l0 Source # | |
type Apply (TyFun b1627953397 (TyFun a1627953396 b1627953397 -> Type) -> Type) (TyFun b1627953397 (TyFun [a1627953396] b1627953397 -> Type) -> Type) (Foldl'Sym0 a1627953396 b1627953397) l0 Source # | |
type Apply (TyFun a1627953390 [b1627953391] -> Type) (TyFun [a1627953390] [b1627953391] -> Type) (ConcatMapSym0 a1627953390 b1627953391) l0 Source # | |
type Apply (TyFun b1627953387 (TyFun a1627953388 b1627953387 -> Type) -> Type) (TyFun b1627953387 (TyFun [a1627953388] [b1627953387] -> Type) -> Type) (ScanlSym0 a1627953388 b1627953387) l0 Source # | |
type Apply (TyFun a1627953384 (TyFun b1627953385 b1627953385 -> Type) -> Type) (TyFun b1627953385 (TyFun [a1627953384] [b1627953385] -> Type) -> Type) (ScanrSym0 a1627953384 b1627953385) l0 Source # | |
type Apply (TyFun b1627953375 (Maybe (a1627953376, b1627953375)) -> Type) (TyFun b1627953375 [a1627953376] -> Type) (UnfoldrSym0 b1627953375 a1627953376) l0 Source # | |
type Apply (a1627840719, b1627840720) (b1627840720, a1627840719) (SwapSym0 b1627840720 a1627840719) l0 Source # | |
type Apply (TyFun (a1627840724, b1627840725) c1627840726 -> Type) (TyFun a1627840724 (TyFun b1627840725 c1627840726 -> Type) -> Type) (CurrySym0 a1627840724 b1627840725 c1627840726) l0 Source # | |
type Apply (TyFun b1627796648 c1627796649 -> Type) (TyFun (TyFun a1627796650 b1627796648 -> Type) (TyFun a1627796650 c1627796649 -> Type) -> Type) ((:.$) b1627796648 a1627796650 c1627796649) l0 Source # | |
type Apply (TyFun a1627796645 (TyFun b1627796646 c1627796647 -> Type) -> Type) (TyFun b1627796646 (TyFun a1627796645 c1627796647 -> Type) -> Type) (FlipSym0 b1627796646 a1627796645 c1627796647) l0 Source # | |
type Apply (TyFun a1627829180 c1627829181 -> Type) (TyFun (TyFun b1627829182 c1627829181 -> Type) (TyFun (Either a1627829180 b1627829182) c1627829181 -> Type) -> Type) (Either_Sym0 a1627829180 b1627829182 c1627829181) l0 Source # | |
type Apply (TyFun a1627840721 (TyFun b1627840722 c1627840723 -> Type) -> Type) (TyFun (a1627840721, b1627840722) c1627840723 -> Type) (UncurrySym0 a1627840721 b1627840722 c1627840723) l0 Source # | |
type Apply (TyFun a1627847772 b1627847771 -> Type) (TyFun (Maybe a1627847772) b1627847771 -> Type) (Maybe_Sym1 a1627847772 b1627847771 l1) l0 Source # | |
type Apply (TyFun acc1627953380 (TyFun x1627953381 (acc1627953380, y1627953382) -> Type) -> Type) (TyFun acc1627953380 (TyFun [x1627953381] (acc1627953380, [y1627953382]) -> Type) -> Type) (MapAccumLSym0 x1627953381 acc1627953380 y1627953382) l0 Source # | |
type Apply (TyFun acc1627953377 (TyFun x1627953378 (acc1627953377, y1627953379) -> Type) -> Type) (TyFun acc1627953377 (TyFun [x1627953378] (acc1627953377, [y1627953379]) -> Type) -> Type) (MapAccumRSym0 x1627953378 acc1627953377 y1627953379) l0 Source # | |
type Apply (TyFun a1627953360 (TyFun b1627953361 c1627953362 -> Type) -> Type) (TyFun [a1627953360] (TyFun [b1627953361] [c1627953362] -> Type) -> Type) (ZipWithSym0 a1627953360 b1627953361 c1627953362) l0 Source # | |
type Apply (TyFun a1627796650 b1627796648 -> Type) (TyFun a1627796650 c1627796649 -> Type) ((:.$$) a1627796650 b1627796648 c1627796649 l1) l0 Source # | |
type Apply (TyFun b1627829182 c1627829181 -> Type) (TyFun (Either a1627829180 b1627829182) c1627829181 -> Type) (Either_Sym1 b1627829182 a1627829180 c1627829181 l1) l0 Source # | |
type Apply (TyFun a1627953356 (TyFun b1627953357 (TyFun c1627953358 d1627953359 -> Type) -> Type) -> Type) (TyFun [a1627953356] (TyFun [b1627953357] (TyFun [c1627953358] [d1627953359] -> Type) -> Type) -> Type) (ZipWith3Sym0 a1627953356 b1627953357 c1627953358 d1627953359) l0 Source # | |
type Apply (TyFun a1628251660 (TyFun b1628251661 (TyFun c1628251662 (TyFun d1628251663 e1628251664 -> Type) -> Type) -> Type) -> Type) (TyFun [a1628251660] (TyFun [b1628251661] (TyFun [c1628251662] (TyFun [d1628251663] [e1628251664] -> Type) -> Type) -> Type) -> Type) (ZipWith4Sym0 a1628251660 b1628251661 c1628251662 d1628251663 e1628251664) l0 Source # | |
type Apply (TyFun a1628251654 (TyFun b1628251655 (TyFun c1628251656 (TyFun d1628251657 (TyFun e1628251658 f1628251659 -> Type) -> Type) -> Type) -> Type) -> Type) (TyFun [a1628251654] (TyFun [b1628251655] (TyFun [c1628251656] (TyFun [d1628251657] (TyFun [e1628251658] [f1628251659] -> Type) -> Type) -> Type) -> Type) -> Type) (ZipWith5Sym0 a1628251654 b1628251655 c1628251656 d1628251657 e1628251658 f1628251659) l0 Source # | |
type Apply (TyFun a1628251647 (TyFun b1628251648 (TyFun c1628251649 (TyFun d1628251650 (TyFun e1628251651 (TyFun f1628251652 g1628251653 -> Type) -> Type) -> Type) -> Type) -> Type) -> Type) (TyFun [a1628251647] (TyFun [b1628251648] (TyFun [c1628251649] (TyFun [d1628251650] (TyFun [e1628251651] (TyFun [f1628251652] [g1628251653] -> Type) -> Type) -> Type) -> Type) -> Type) -> Type) (ZipWith6Sym0 a1628251647 b1628251648 c1628251649 d1628251650 e1628251651 f1628251652 g1628251653) l0 Source # | |
type Apply (TyFun a1628251639 (TyFun b1628251640 (TyFun c1628251641 (TyFun d1628251642 (TyFun e1628251643 (TyFun f1628251644 (TyFun g1628251645 h1628251646 -> Type) -> Type) -> Type) -> Type) -> Type) -> Type) -> Type) (TyFun [a1628251639] (TyFun [b1628251640] (TyFun [c1628251641] (TyFun [d1628251642] (TyFun [e1628251643] (TyFun [f1628251644] (TyFun [g1628251645] [h1628251646] -> Type) -> Type) -> Type) -> Type) -> Type) -> Type) -> Type) (ZipWith7Sym0 a1628251639 b1628251640 c1628251641 d1628251642 e1628251643 f1628251644 g1628251645 h1628251646) l0 Source # | |
Defunctionalized singletons
When calling a higher-order singleton function, you need to use a
singFun...
function to wrap it. See singFun1
.
singFun1 :: Proxy f -> SingFunction1 f -> Sing f Source #
Use this function when passing a function on singletons as a higher-order function. You will often need an explicit type annotation to get this to work. For example:
falses = sMap (singFun1 (Proxy :: Proxy NotSym0) sNot) (STrue `SCons` STrue `SCons` SNil)
There are a family of singFun...
functions, keyed by the number
of parameters of the function.
unSingFun1 :: Proxy f -> Sing f -> SingFunction1 f Source #
This is the inverse of singFun1
, and likewise for the other
unSingFun...
functions.
unSingFun2 :: Proxy f -> Sing f -> SingFunction2 f Source #
unSingFun3 :: Proxy f -> Sing f -> SingFunction3 f Source #
unSingFun4 :: Proxy f -> Sing f -> SingFunction4 f Source #
unSingFun5 :: Proxy f -> Sing f -> SingFunction5 f Source #
unSingFun6 :: Proxy f -> Sing f -> SingFunction6 f Source #
unSingFun7 :: Proxy f -> Sing f -> SingFunction7 f Source #
unSingFun8 :: Proxy f -> Sing f -> SingFunction8 f Source #
These type synonyms are exported only to improve error messages; users should not have to mention them.
type SingFunction2 f = forall t. Sing t -> SingFunction1 (f @@ t) Source #
type SingFunction3 f = forall t. Sing t -> SingFunction2 (f @@ t) Source #
type SingFunction4 f = forall t. Sing t -> SingFunction3 (f @@ t) Source #
type SingFunction5 f = forall t. Sing t -> SingFunction4 (f @@ t) Source #
type SingFunction6 f = forall t. Sing t -> SingFunction5 (f @@ t) Source #
type SingFunction7 f = forall t. Sing t -> SingFunction6 (f @@ t) Source #
type SingFunction8 f = forall t. Sing t -> SingFunction7 (f @@ t) Source #
Auxiliary functions
data Proxy k t :: forall k. k -> * #
A concrete, poly-kinded proxy type
Monad (Proxy *) | |
Functor (Proxy *) | |
Applicative (Proxy *) | |
Foldable (Proxy *) | |
Traversable (Proxy *) | |
Generic1 (Proxy *) | |
Eq1 (Proxy *) | Since: 4.9.0.0 |
Ord1 (Proxy *) | Since: 4.9.0.0 |
Read1 (Proxy *) | Since: 4.9.0.0 |
Show1 (Proxy *) | Since: 4.9.0.0 |
Alternative (Proxy *) | |
MonadPlus (Proxy *) | |
Bounded (Proxy k s) | |
Enum (Proxy k s) | |
Eq (Proxy k s) | |
Data t => Data (Proxy * t) | |
Ord (Proxy k s) | |
Read (Proxy k s) | |
Show (Proxy k s) | |
Ix (Proxy k s) | |
Generic (Proxy k t) | |
Semigroup (Proxy k s) | |
Monoid (Proxy k s) | |
type Rep1 (Proxy *) | |
type Rep (Proxy k t) | |