halg-core-0.6.0.0: Core types and functions of halg computational algebra suite.
Safe HaskellNone
LanguageHaskell2010

Algebra.Internal

Synopsis

Documentation

data (a :: k) :~: (b :: k) where infix 4 #

Propositional equality. If a :~: b is inhabited by some terminating value, then the type a is the same as the type b. To use this equality in practice, pattern-match on the a :~: b to get out the Refl constructor; in the body of the pattern-match, the compiler knows that a ~ b.

Since: base-4.7.0.0

Constructors

Refl :: forall k (a :: k). a :~: a 

Instances

Instances details
Equality ((:=:) :: k -> k -> Type) 
Instance details

Defined in Proof.Equational

Methods

symmetry :: forall (a :: k0) (b :: k0). (a :=: b) -> b :=: a

Preorder ((:=:) :: k -> k -> Type) 
Instance details

Defined in Proof.Equational

Methods

reflexivity :: forall proxy (a :: k0). proxy a -> a :=: a

transitivity :: forall (a :: k0) (b :: k0) (c :: k0). (a :=: b) -> (b :=: c) -> a :=: c

Semigroupoid ((:~:) :: k -> k -> Type) 
Instance details

Defined in Data.Semigroupoid

Methods

o :: forall (j :: k0) (k1 :: k0) (i :: k0). (j :~: k1) -> (i :~: j) -> i :~: k1

TestEquality ((:~:) a :: k -> Type)

Since: base-4.7.0.0

Instance details

Defined in Data.Type.Equality

Methods

testEquality :: forall (a0 :: k0) (b :: k0). (a :~: a0) -> (a :~: b) -> Maybe (a0 :~: b) #

NFData2 ((:~:) :: Type -> Type -> Type)

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

liftRnf2 :: (a -> ()) -> (b -> ()) -> (a :~: b) -> () #

NFData1 ((:~:) a)

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

liftRnf :: (a0 -> ()) -> (a :~: a0) -> () #

a ~ b => Bounded (a :~: b)

Since: base-4.7.0.0

Instance details

Defined in Data.Type.Equality

Methods

minBound :: a :~: b #

maxBound :: a :~: b #

a ~ b => Enum (a :~: b)

Since: base-4.7.0.0

Instance details

Defined in Data.Type.Equality

Methods

succ :: (a :~: b) -> a :~: b #

pred :: (a :~: b) -> a :~: b #

toEnum :: Int -> a :~: b #

fromEnum :: (a :~: b) -> Int #

enumFrom :: (a :~: b) -> [a :~: b] #

enumFromThen :: (a :~: b) -> (a :~: b) -> [a :~: b] #

enumFromTo :: (a :~: b) -> (a :~: b) -> [a :~: b] #

enumFromThenTo :: (a :~: b) -> (a :~: b) -> (a :~: b) -> [a :~: b] #

Eq (a :~: b)

Since: base-4.7.0.0

Instance details

Defined in Data.Type.Equality

Methods

(==) :: (a :~: b) -> (a :~: b) -> Bool #

(/=) :: (a :~: b) -> (a :~: b) -> Bool #

(a ~ b, Data a) => Data (a :~: b)

Since: base-4.7.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b0. Data d => c (d -> b0) -> d -> c b0) -> (forall g. g -> c g) -> (a :~: b) -> c (a :~: b) #

gunfold :: (forall b0 r. Data b0 => c (b0 -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (a :~: b) #

toConstr :: (a :~: b) -> Constr #

dataTypeOf :: (a :~: b) -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (a :~: b)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (a :~: b)) #

gmapT :: (forall b0. Data b0 => b0 -> b0) -> (a :~: b) -> a :~: b #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> (a :~: b) -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> (a :~: b) -> r #

gmapQ :: (forall d. Data d => d -> u) -> (a :~: b) -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> (a :~: b) -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> (a :~: b) -> m (a :~: b) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> (a :~: b) -> m (a :~: b) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> (a :~: b) -> m (a :~: b) #

Ord (a :~: b)

Since: base-4.7.0.0

Instance details

Defined in Data.Type.Equality

Methods

compare :: (a :~: b) -> (a :~: b) -> Ordering #

(<) :: (a :~: b) -> (a :~: b) -> Bool #

(<=) :: (a :~: b) -> (a :~: b) -> Bool #

(>) :: (a :~: b) -> (a :~: b) -> Bool #

(>=) :: (a :~: b) -> (a :~: b) -> Bool #

max :: (a :~: b) -> (a :~: b) -> a :~: b #

min :: (a :~: b) -> (a :~: b) -> a :~: b #

a ~ b => Read (a :~: b)

Since: base-4.7.0.0

Instance details

Defined in Data.Type.Equality

Methods

readsPrec :: Int -> ReadS (a :~: b) #

readList :: ReadS [a :~: b] #

readPrec :: ReadPrec (a :~: b) #

readListPrec :: ReadPrec [a :~: b] #

Show (a :~: b)

Since: base-4.7.0.0

Instance details

Defined in Data.Type.Equality

Methods

showsPrec :: Int -> (a :~: b) -> ShowS #

show :: (a :~: b) -> String #

showList :: [a :~: b] -> ShowS #

NFData (a :~: b)

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: (a :~: b) -> () #

HasDict (a ~ b) (a :~: b) 
Instance details

Defined in Data.Constraint

Methods

evidence :: (a :~: b) -> Dict (a ~ b)

withRefl :: forall k (a :: k) (b :: k) r. (a :~: b) -> (a ~ b => r) -> r #

asProxyTypeOf :: a -> proxy a -> a #

asProxyTypeOf is a type-restricted version of const. It is usually used as an infix operator, and its typing forces its first argument (which is usually overloaded) to have the same type as the tag of the second.

>>> import Data.Word
>>> :type asProxyTypeOf 123 (Proxy :: Proxy Word8)
asProxyTypeOf 123 (Proxy :: Proxy Word8) :: Word8

Note the lower-case proxy in the definition. This allows any type constructor with just one argument to be passed to the function, for example we could also write

>>> import Data.Word
>>> :type asProxyTypeOf 123 (Just (undefined :: Word8))
asProxyTypeOf 123 (Just (undefined :: Word8)) :: Word8

data Proxy (t :: k) #

Proxy is a type that holds no data, but has a phantom parameter of arbitrary type (or even kind). Its use is to provide type information, even though there is no value available of that type (or it may be too costly to create one).

Historically, Proxy :: Proxy a is a safer alternative to the undefined :: a idiom.

>>> Proxy :: Proxy (Void, Int -> Int)
Proxy

Proxy can even hold types of higher kinds,

>>> Proxy :: Proxy Either
Proxy
>>> Proxy :: Proxy Functor
Proxy
>>> Proxy :: Proxy complicatedStructure
Proxy

Constructors

Proxy 

Instances

Instances details
Generic1 (Proxy :: k -> Type)

Since: base-4.6.0.0

Instance details

Defined in GHC.Generics

Associated Types

type Rep1 Proxy :: k -> Type #

Methods

from1 :: forall (a :: k0). Proxy a -> Rep1 Proxy a #

to1 :: forall (a :: k0). Rep1 Proxy a -> Proxy a #

FoldableWithIndex Void (Proxy :: Type -> Type) 
Instance details

Defined in Control.Lens.Indexed

Methods

ifoldMap :: Monoid m => (Void -> a -> m) -> Proxy a -> m

ifolded :: IndexedFold Void (Proxy a) a

ifoldr :: (Void -> a -> b -> b) -> b -> Proxy a -> b

ifoldl :: (Void -> b -> a -> b) -> b -> Proxy a -> b

ifoldr' :: (Void -> a -> b -> b) -> b -> Proxy a -> b

ifoldl' :: (Void -> b -> a -> b) -> b -> Proxy a -> b

FunctorWithIndex Void (Proxy :: Type -> Type) 
Instance details

Defined in Control.Lens.Indexed

Methods

imap :: (Void -> a -> b) -> Proxy a -> Proxy b

imapped :: IndexedSetter Void (Proxy a) (Proxy b) a b

TraversableWithIndex Void (Proxy :: Type -> Type) 
Instance details

Defined in Control.Lens.Indexed

Methods

itraverse :: Applicative f => (Void -> a -> f b) -> Proxy a -> f (Proxy b)

itraversed :: IndexedTraversal Void (Proxy a) (Proxy b) a b

Monad (Proxy :: Type -> Type)

Since: base-4.7.0.0

Instance details

Defined in Data.Proxy

Methods

(>>=) :: Proxy a -> (a -> Proxy b) -> Proxy b #

(>>) :: Proxy a -> Proxy b -> Proxy b #

return :: a -> Proxy a #

Functor (Proxy :: Type -> Type)

Since: base-4.7.0.0

Instance details

Defined in Data.Proxy

Methods

fmap :: (a -> b) -> Proxy a -> Proxy b #

(<$) :: a -> Proxy b -> Proxy a #

Applicative (Proxy :: Type -> Type)

Since: base-4.7.0.0

Instance details

Defined in Data.Proxy

Methods

pure :: a -> Proxy a #

(<*>) :: Proxy (a -> b) -> Proxy a -> Proxy b #

liftA2 :: (a -> b -> c) -> Proxy a -> Proxy b -> Proxy c #

(*>) :: Proxy a -> Proxy b -> Proxy b #

(<*) :: Proxy a -> Proxy b -> Proxy a #

Foldable (Proxy :: Type -> Type)

Since: base-4.7.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => Proxy m -> m #

foldMap :: Monoid m => (a -> m) -> Proxy a -> m #

foldMap' :: Monoid m => (a -> m) -> Proxy a -> m #

foldr :: (a -> b -> b) -> b -> Proxy a -> b #

foldr' :: (a -> b -> b) -> b -> Proxy a -> b #

foldl :: (b -> a -> b) -> b -> Proxy a -> b #

foldl' :: (b -> a -> b) -> b -> Proxy a -> b #

foldr1 :: (a -> a -> a) -> Proxy a -> a #

foldl1 :: (a -> a -> a) -> Proxy a -> a #

toList :: Proxy a -> [a] #

null :: Proxy a -> Bool #

length :: Proxy a -> Int #

elem :: Eq a => a -> Proxy a -> Bool #

maximum :: Ord a => Proxy a -> a #

minimum :: Ord a => Proxy a -> a #

sum :: Num a => Proxy a -> a #

product :: Num a => Proxy a -> a #

Traversable (Proxy :: Type -> Type)

Since: base-4.7.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> Proxy a -> f (Proxy b) #

sequenceA :: Applicative f => Proxy (f a) -> f (Proxy a) #

mapM :: Monad m => (a -> m b) -> Proxy a -> m (Proxy b) #

sequence :: Monad m => Proxy (m a) -> m (Proxy a) #

MonadPlus (Proxy :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Proxy

Methods

mzero :: Proxy a #

mplus :: Proxy a -> Proxy a -> Proxy a #

Contravariant (Proxy :: Type -> Type) 
Instance details

Defined in Data.Functor.Contravariant

Methods

contramap :: (a -> b) -> Proxy b -> Proxy a #

(>$) :: b -> Proxy b -> Proxy a #

Eq1 (Proxy :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftEq :: (a -> b -> Bool) -> Proxy a -> Proxy b -> Bool #

Ord1 (Proxy :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftCompare :: (a -> b -> Ordering) -> Proxy a -> Proxy b -> Ordering #

Read1 (Proxy :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftReadsPrec :: (Int -> ReadS a) -> ReadS [a] -> Int -> ReadS (Proxy a) #

liftReadList :: (Int -> ReadS a) -> ReadS [a] -> ReadS [Proxy a] #

liftReadPrec :: ReadPrec a -> ReadPrec [a] -> ReadPrec (Proxy a) #

liftReadListPrec :: ReadPrec a -> ReadPrec [a] -> ReadPrec [Proxy a] #

Show1 (Proxy :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftShowsPrec :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> Int -> Proxy a -> ShowS #

liftShowList :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> [Proxy a] -> ShowS #

Alternative (Proxy :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Proxy

Methods

empty :: Proxy a #

(<|>) :: Proxy a -> Proxy a -> Proxy a #

some :: Proxy a -> Proxy [a] #

many :: Proxy a -> Proxy [a] #

NFData1 (Proxy :: Type -> Type)

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

liftRnf :: (a -> ()) -> Proxy a -> () #

Hashable1 (Proxy :: Type -> Type) 
Instance details

Defined in Data.Hashable.Class

Methods

liftHashWithSalt :: (Int -> a -> Int) -> Int -> Proxy a -> Int

Representable (Proxy :: Type -> Type) 
Instance details

Defined in Data.Functor.Rep

Associated Types

type Rep Proxy

Methods

tabulate :: (Rep Proxy -> a) -> Proxy a

index :: Proxy a -> Rep Proxy -> a

Apply (Proxy :: Type -> Type) 
Instance details

Defined in Data.Functor.Bind.Class

Methods

(<.>) :: Proxy (a -> b) -> Proxy a -> Proxy b

(.>) :: Proxy a -> Proxy b -> Proxy b

(<.) :: Proxy a -> Proxy b -> Proxy a

liftF2 :: (a -> b -> c) -> Proxy a -> Proxy b -> Proxy c

Bind (Proxy :: Type -> Type) 
Instance details

Defined in Data.Functor.Bind.Class

Methods

(>>-) :: Proxy a -> (a -> Proxy b) -> Proxy b

join :: Proxy (Proxy a) -> Proxy a

Adjustable (Proxy :: Type -> Type) 
Instance details

Defined in Data.Key

Methods

adjust :: (a -> a) -> Key Proxy -> Proxy a -> Proxy a

replace :: Key Proxy -> a -> Proxy a -> Proxy a

FoldableWithKey (Proxy :: Type -> Type) 
Instance details

Defined in Data.Key

Methods

toKeyedList :: Proxy a -> [(Key Proxy, a)]

foldMapWithKey :: Monoid m => (Key Proxy -> a -> m) -> Proxy a -> m

foldrWithKey :: (Key Proxy -> a -> b -> b) -> b -> Proxy a -> b

foldlWithKey :: (b -> Key Proxy -> a -> b) -> b -> Proxy a -> b

Indexable (Proxy :: Type -> Type) 
Instance details

Defined in Data.Key

Methods

index :: Proxy a -> Key Proxy -> a

Keyed (Proxy :: Type -> Type) 
Instance details

Defined in Data.Key

Methods

mapWithKey :: (Key Proxy -> a -> b) -> Proxy a -> Proxy b

Lookup (Proxy :: Type -> Type) 
Instance details

Defined in Data.Key

Methods

lookup :: Key Proxy -> Proxy a -> Maybe a

TraversableWithKey (Proxy :: Type -> Type) 
Instance details

Defined in Data.Key

Methods

traverseWithKey :: Applicative f => (Key Proxy -> a -> f b) -> Proxy a -> f (Proxy b)

mapWithKeyM :: Monad m => (Key Proxy -> a -> m b) -> Proxy a -> m (Proxy b)

Zip (Proxy :: Type -> Type) 
Instance details

Defined in Data.Key

Methods

zipWith :: (a -> b -> c) -> Proxy a -> Proxy b -> Proxy c

zip :: Proxy a -> Proxy b -> Proxy (a, b)

zap :: Proxy (a -> b) -> Proxy a -> Proxy b

ZipWithKey (Proxy :: Type -> Type) 
Instance details

Defined in Data.Key

Methods

zipWithKey :: (Key Proxy -> a -> b -> c) -> Proxy a -> Proxy b -> Proxy c

zapWithKey :: Proxy (Key Proxy -> a -> b) -> Proxy a -> Proxy b

PFoldable (Proxy :: Type -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

Associated Types

type Fold arg :: m

type FoldMap arg arg1 :: m

type Foldr arg arg1 arg2 :: b

type Foldr' arg arg1 arg2 :: b

type Foldl arg arg1 arg2 :: b

type Foldl' arg arg1 arg2 :: b

type Foldr1 arg arg1 :: a

type Foldl1 arg arg1 :: a

type ToList arg :: [a]

type Null arg :: Bool

type Length arg :: Nat

type Elem arg arg1 :: Bool

type Maximum arg :: a

type Minimum arg :: a

type Sum arg :: a

type Product arg :: a

SFoldable (Proxy :: Type -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

Methods

sFold :: forall m (t1 :: Proxy m). SMonoid m => Sing t1 -> Sing (Apply FoldSym0 t1)

sFoldMap :: forall a m (t1 :: a ~> m) (t2 :: Proxy a). SMonoid m => Sing t1 -> Sing t2 -> Sing (Apply (Apply FoldMapSym0 t1) t2)

sFoldr :: forall a b (t1 :: a ~> (b ~> b)) (t2 :: b) (t3 :: Proxy a). Sing t1 -> Sing t2 -> Sing t3 -> Sing (Apply (Apply (Apply FoldrSym0 t1) t2) t3)

sFoldr' :: forall a b (t1 :: a ~> (b ~> b)) (t2 :: b) (t3 :: Proxy a). Sing t1 -> Sing t2 -> Sing t3 -> Sing (Apply (Apply (Apply Foldr'Sym0 t1) t2) t3)

sFoldl :: forall b a (t1 :: b ~> (a ~> b)) (t2 :: b) (t3 :: Proxy a). Sing t1 -> Sing t2 -> Sing t3 -> Sing (Apply (Apply (Apply FoldlSym0 t1) t2) t3)

sFoldl' :: forall b a (t1 :: b ~> (a ~> b)) (t2 :: b) (t3 :: Proxy a). Sing t1 -> Sing t2 -> Sing t3 -> Sing (Apply (Apply (Apply Foldl'Sym0 t1) t2) t3)

sFoldr1 :: forall a (t1 :: a ~> (a ~> a)) (t2 :: Proxy a). Sing t1 -> Sing t2 -> Sing (Apply (Apply Foldr1Sym0 t1) t2)

sFoldl1 :: forall a (t1 :: a ~> (a ~> a)) (t2 :: Proxy a). Sing t1 -> Sing t2 -> Sing (Apply (Apply Foldl1Sym0 t1) t2)

sToList :: forall a (t1 :: Proxy a). Sing t1 -> Sing (Apply ToListSym0 t1)

sNull :: forall a (t1 :: Proxy a). Sing t1 -> Sing (Apply NullSym0 t1)

sLength :: forall a (t1 :: Proxy a). Sing t1 -> Sing (Apply LengthSym0 t1)

sElem :: forall a (t1 :: a) (t2 :: Proxy a). SEq a => Sing t1 -> Sing t2 -> Sing (Apply (Apply ElemSym0 t1) t2)

sMaximum :: forall a (t1 :: Proxy a). SOrd a => Sing t1 -> Sing (Apply MaximumSym0 t1)

sMinimum :: forall a (t1 :: Proxy a). SOrd a => Sing t1 -> Sing (Apply MinimumSym0 t1)

sSum :: forall a (t1 :: Proxy a). SNum a => Sing t1 -> Sing (Apply SumSym0 t1)

sProduct :: forall a (t1 :: Proxy a). SNum a => Sing t1 -> Sing (Apply ProductSym0 t1)

PTraversable (Proxy :: Type -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

Associated Types

type Traverse arg arg1 :: f (t b)

type SequenceA arg :: f (t a)

type MapM arg arg1 :: m (t b)

type Sequence arg :: m (t a)

STraversable (Proxy :: Type -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

Methods

sTraverse :: forall a (f :: Type -> Type) b (t1 :: a ~> f b) (t2 :: Proxy a). SApplicative f => Sing t1 -> Sing t2 -> Sing (Apply (Apply TraverseSym0 t1) t2)

sSequenceA :: forall (f :: Type -> Type) a (t1 :: Proxy (f a)). SApplicative f => Sing t1 -> Sing (Apply SequenceASym0 t1)

sMapM :: forall a (m :: Type -> Type) b (t1 :: a ~> m b) (t2 :: Proxy a). SMonad m => Sing t1 -> Sing t2 -> Sing (Apply (Apply MapMSym0 t1) t2)

sSequence :: forall (m :: Type -> Type) a (t1 :: Proxy (m a)). SMonad m => Sing t1 -> Sing (Apply SequenceSym0 t1)

CFoldable (Proxy :: Type -> Type) 
Instance details

Defined in Control.Subcategory.Foldable

Methods

cfoldMap :: (Dom Proxy a, Monoid w) => (a -> w) -> Proxy a -> w

cfoldMap' :: (Dom Proxy a, Monoid m) => (a -> m) -> Proxy a -> m

cfold :: (Dom Proxy w, Monoid w) => Proxy w -> w

cfoldr :: Dom Proxy a => (a -> b -> b) -> b -> Proxy a -> b

cfoldlM :: (Monad m, Dom Proxy b) => (a -> b -> m a) -> a -> Proxy b -> m a

cfoldlM' :: (Monad m, Dom Proxy b) => (a -> b -> m a) -> a -> Proxy b -> m a

cfoldrM :: (Monad m, Dom Proxy a) => (a -> b -> m b) -> b -> Proxy a -> m b

cfoldrM' :: (Monad m, Dom Proxy a) => (a -> b -> m b) -> b -> Proxy a -> m b

cfoldl :: Dom Proxy a => (b -> a -> b) -> b -> Proxy a -> b

cfoldr' :: Dom Proxy a => (a -> b -> b) -> b -> Proxy a -> b

cfoldl' :: Dom Proxy a => (b -> a -> b) -> b -> Proxy a -> b

cbasicToList :: Dom Proxy a => Proxy a -> [a]

cfoldr1 :: Dom Proxy a => (a -> a -> a) -> Proxy a -> a

cfoldl1 :: Dom Proxy a => (a -> a -> a) -> Proxy a -> a

cindex :: Dom Proxy a => Proxy a -> Int -> a

cnull :: Dom Proxy a => Proxy a -> Bool

clength :: Dom Proxy a => Proxy a -> Int

cany :: Dom Proxy a => (a -> Bool) -> Proxy a -> Bool

call :: Dom Proxy a => (a -> Bool) -> Proxy a -> Bool

celem :: (Eq a, Dom Proxy a) => a -> Proxy a -> Bool

cnotElem :: (Eq a, Dom Proxy a) => a -> Proxy a -> Bool

cminimum :: (Ord a, Dom Proxy a) => Proxy a -> a

cmaximum :: (Ord a, Dom Proxy a) => Proxy a -> a

csum :: (Num a, Dom Proxy a) => Proxy a -> a

cproduct :: (Num a, Dom Proxy a) => Proxy a -> a

cctraverse_ :: (CApplicative g, CPointed g, Dom g (), Dom Proxy a, Dom g b) => (a -> g b) -> Proxy a -> g ()

ctraverse_ :: (Applicative g, Dom Proxy a) => (a -> g b) -> Proxy a -> g ()

clast :: Dom Proxy a => Proxy a -> a

chead :: Dom Proxy a => Proxy a -> a

cfind :: Dom Proxy a => (a -> Bool) -> Proxy a -> Maybe a

cfindIndex :: Dom Proxy a => (a -> Bool) -> Proxy a -> Maybe Int

cfindIndices :: Dom Proxy a => (a -> Bool) -> Proxy a -> [Int]

celemIndex :: (Dom Proxy a, Eq a) => a -> Proxy a -> Maybe Int

celemIndices :: (Dom Proxy a, Eq a) => a -> Proxy a -> [Int]

CZip (Proxy :: Type -> Type) 
Instance details

Defined in Control.Subcategory.Zip

Methods

czipWith :: (Dom Proxy a, Dom Proxy b, Dom Proxy c) => (a -> b -> c) -> Proxy a -> Proxy b -> Proxy c

czip :: (Dom Proxy a, Dom Proxy b, Dom Proxy (a, b)) => Proxy a -> Proxy b -> Proxy (a, b)

CFunctor (Proxy :: Type -> Type) 
Instance details

Defined in Control.Subcategory.Functor

Methods

cmap :: (Dom Proxy a, Dom Proxy b) => (a -> b) -> Proxy a -> Proxy b

(<$:) :: (Dom Proxy a, Dom Proxy b) => a -> Proxy b -> Proxy a

CPointed (Proxy :: Type -> Type) 
Instance details

Defined in Control.Subcategory.Pointed

Methods

cpure :: Dom Proxy a => a -> Proxy a

CTraversable (Proxy :: Type -> Type) 
Instance details

Defined in Control.Subcategory.Foldable

Methods

ctraverse :: (Dom Proxy a, Dom Proxy b, Applicative g) => (a -> g b) -> Proxy a -> g (Proxy b)

CUnzip (Proxy :: Type -> Type) 
Instance details

Defined in Control.Subcategory.Zip

Methods

cunzip :: (Dom Proxy (a, b), Dom Proxy a, Dom Proxy b) => Proxy (a, b) -> (Proxy a, Proxy b)

cunzipWith :: (Dom Proxy c, Dom Proxy a, Dom Proxy b) => (c -> (a, b)) -> Proxy c -> (Proxy a, Proxy b)

Constrained (Proxy :: Type -> Type) 
Instance details

Defined in Control.Subcategory.Functor

Associated Types

type Dom Proxy a

Bounded (Proxy t)

Since: base-4.7.0.0

Instance details

Defined in Data.Proxy

Methods

minBound :: Proxy t #

maxBound :: Proxy t #

Enum (Proxy s)

Since: base-4.7.0.0

Instance details

Defined in Data.Proxy

Methods

succ :: Proxy s -> Proxy s #

pred :: Proxy s -> Proxy s #

toEnum :: Int -> Proxy s #

fromEnum :: Proxy s -> Int #

enumFrom :: Proxy s -> [Proxy s] #

enumFromThen :: Proxy s -> Proxy s -> [Proxy s] #

enumFromTo :: Proxy s -> Proxy s -> [Proxy s] #

enumFromThenTo :: Proxy s -> Proxy s -> Proxy s -> [Proxy s] #

Eq (Proxy s)

Since: base-4.7.0.0

Instance details

Defined in Data.Proxy

Methods

(==) :: Proxy s -> Proxy s -> Bool #

(/=) :: Proxy s -> Proxy s -> Bool #

Data t => Data (Proxy t)

Since: base-4.7.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Proxy t -> c (Proxy t) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Proxy t) #

toConstr :: Proxy t -> Constr #

dataTypeOf :: Proxy t -> DataType #

dataCast1 :: Typeable t0 => (forall d. Data d => c (t0 d)) -> Maybe (c (Proxy t)) #

dataCast2 :: Typeable t0 => (forall d e. (Data d, Data e) => c (t0 d e)) -> Maybe (c (Proxy t)) #

gmapT :: (forall b. Data b => b -> b) -> Proxy t -> Proxy t #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Proxy t -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Proxy t -> r #

gmapQ :: (forall d. Data d => d -> u) -> Proxy t -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Proxy t -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Proxy t -> m (Proxy t) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Proxy t -> m (Proxy t) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Proxy t -> m (Proxy t) #

Ord (Proxy s)

Since: base-4.7.0.0

Instance details

Defined in Data.Proxy

Methods

compare :: Proxy s -> Proxy s -> Ordering #

(<) :: Proxy s -> Proxy s -> Bool #

(<=) :: Proxy s -> Proxy s -> Bool #

(>) :: Proxy s -> Proxy s -> Bool #

(>=) :: Proxy s -> Proxy s -> Bool #

max :: Proxy s -> Proxy s -> Proxy s #

min :: Proxy s -> Proxy s -> Proxy s #

Read (Proxy t)

Since: base-4.7.0.0

Instance details

Defined in Data.Proxy

Show (Proxy s)

Since: base-4.7.0.0

Instance details

Defined in Data.Proxy

Methods

showsPrec :: Int -> Proxy s -> ShowS #

show :: Proxy s -> String #

showList :: [Proxy s] -> ShowS #

Ix (Proxy s)

Since: base-4.7.0.0

Instance details

Defined in Data.Proxy

Methods

range :: (Proxy s, Proxy s) -> [Proxy s] #

index :: (Proxy s, Proxy s) -> Proxy s -> Int #

unsafeIndex :: (Proxy s, Proxy s) -> Proxy s -> Int #

inRange :: (Proxy s, Proxy s) -> Proxy s -> Bool #

rangeSize :: (Proxy s, Proxy s) -> Int #

unsafeRangeSize :: (Proxy s, Proxy s) -> Int #

Generic (Proxy t)

Since: base-4.6.0.0

Instance details

Defined in GHC.Generics

Associated Types

type Rep (Proxy t) :: Type -> Type #

Methods

from :: Proxy t -> Rep (Proxy t) x #

to :: Rep (Proxy t) x -> Proxy t #

Semigroup (Proxy s)

Since: base-4.9.0.0

Instance details

Defined in Data.Proxy

Methods

(<>) :: Proxy s -> Proxy s -> Proxy s #

sconcat :: NonEmpty (Proxy s) -> Proxy s #

stimes :: Integral b => b -> Proxy s -> Proxy s #

Monoid (Proxy s)

Since: base-4.7.0.0

Instance details

Defined in Data.Proxy

Methods

mempty :: Proxy s #

mappend :: Proxy s -> Proxy s -> Proxy s #

mconcat :: [Proxy s] -> Proxy s #

Hashable (Proxy a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Proxy a -> Int #

hash :: Proxy a -> Int #

NFData (Proxy a)

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Proxy a -> () #

MonoFoldable (Proxy a) 
Instance details

Defined in Data.MonoTraversable

Methods

ofoldMap :: Monoid m => (Element (Proxy a) -> m) -> Proxy a -> m

ofoldr :: (Element (Proxy a) -> b -> b) -> b -> Proxy a -> b

ofoldl' :: (a0 -> Element (Proxy a) -> a0) -> a0 -> Proxy a -> a0

otoList :: Proxy a -> [Element (Proxy a)]

oall :: (Element (Proxy a) -> Bool) -> Proxy a -> Bool

oany :: (Element (Proxy a) -> Bool) -> Proxy a -> Bool

onull :: Proxy a -> Bool

olength :: Proxy a -> Int

olength64 :: Proxy a -> Int64

ocompareLength :: Integral i => Proxy a -> i -> Ordering

otraverse_ :: Applicative f => (Element (Proxy a) -> f b) -> Proxy a -> f ()

ofor_ :: Applicative f => Proxy a -> (Element (Proxy a) -> f b) -> f ()

omapM_ :: Applicative m => (Element (Proxy a) -> m ()) -> Proxy a -> m ()

oforM_ :: Applicative m => Proxy a -> (Element (Proxy a) -> m ()) -> m ()

ofoldlM :: Monad m => (a0 -> Element (Proxy a) -> m a0) -> a0 -> Proxy a -> m a0

ofoldMap1Ex :: Semigroup m => (Element (Proxy a) -> m) -> Proxy a -> m

ofoldr1Ex :: (Element (Proxy a) -> Element (Proxy a) -> Element (Proxy a)) -> Proxy a -> Element (Proxy a)

ofoldl1Ex' :: (Element (Proxy a) -> Element (Proxy a) -> Element (Proxy a)) -> Proxy a -> Element (Proxy a)

headEx :: Proxy a -> Element (Proxy a)

lastEx :: Proxy a -> Element (Proxy a)

unsafeHead :: Proxy a -> Element (Proxy a)

unsafeLast :: Proxy a -> Element (Proxy a)

maximumByEx :: (Element (Proxy a) -> Element (Proxy a) -> Ordering) -> Proxy a -> Element (Proxy a)

minimumByEx :: (Element (Proxy a) -> Element (Proxy a) -> Ordering) -> Proxy a -> Element (Proxy a)

oelem :: Element (Proxy a) -> Proxy a -> Bool

onotElem :: Element (Proxy a) -> Proxy a -> Bool

MonoFunctor (Proxy a) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (Proxy a) -> Element (Proxy a)) -> Proxy a -> Proxy a

MonoTraversable (Proxy a) 
Instance details

Defined in Data.MonoTraversable

Methods

otraverse :: Applicative f => (Element (Proxy a) -> f (Element (Proxy a))) -> Proxy a -> f (Proxy a)

omapM :: Applicative m => (Element (Proxy a) -> m (Element (Proxy a))) -> Proxy a -> m (Proxy a)

MonoPointed (Proxy a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (Proxy a) -> Proxy a

SuppressUnusedWarnings (Elem_6989586621680823507Sym0 :: TyFun a (Proxy a ~> Bool) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (Pure_6989586621680787330Sym0 :: TyFun a (Proxy a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Proxy

SuppressUnusedWarnings (Sum_6989586621680823515Sym0 :: TyFun (Proxy a) a -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (Product_6989586621680823521Sym0 :: TyFun (Proxy a) a -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (Fold_6989586621680823444Sym0 :: TyFun (Proxy m) m -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (Foldr1_6989586621680823486Sym0 :: TyFun (a ~> (a ~> a)) (Proxy a ~> a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (Foldl1_6989586621680823477Sym0 :: TyFun (a ~> (a ~> a)) (Proxy a ~> a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

TestCoercion (SProxy :: Proxy t -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Proxy

Methods

testCoercion :: forall (a :: k) (b :: k). SProxy a -> SProxy b -> Maybe (Coercion a b) #

TestEquality (SProxy :: Proxy t -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Proxy

Methods

testEquality :: forall (a :: k) (b :: k). SProxy a -> SProxy b -> Maybe (a :~: b) #

SuppressUnusedWarnings (Mconcat_6989586621680787315Sym0 :: TyFun [Proxy s] (Proxy s) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Proxy

SuppressUnusedWarnings (ToEnum_6989586621680787264Sym0 :: TyFun Nat (Proxy s) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Proxy

SuppressUnusedWarnings (ShowsPrec_6989586621680787233Sym0 :: TyFun Nat (Proxy s ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Proxy

SuppressUnusedWarnings (Sequence_6989586621681088388Sym0 :: TyFun (Proxy (m a)) (m (Proxy a)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

SuppressUnusedWarnings (SequenceA_6989586621681088373Sym0 :: TyFun (Proxy (f a)) (f (Proxy a)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

SuppressUnusedWarnings (Foldr1_6989586621680823486Sym1 a6989586621680823491 :: TyFun (Proxy a) a -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (Foldl1_6989586621680823477Sym1 a6989586621680823482 :: TyFun (Proxy a) a -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (TFHelper_6989586621680787337Sym0 :: TyFun (Proxy (a ~> b)) (Proxy a ~> Proxy b) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Proxy

SuppressUnusedWarnings (Elem_6989586621680823507Sym1 a6989586621680823512 :: TyFun (Proxy a) Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (Null_6989586621680823500Sym0 :: TyFun (Proxy a) Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (Length_6989586621680823494Sym0 :: TyFun (Proxy a) Nat -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (TFHelper_6989586621680787349Sym0 :: TyFun (Proxy a) (Proxy a ~> Proxy a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Proxy

SuppressUnusedWarnings (TFHelper_6989586621680787298Sym0 :: TyFun (Proxy s) (Proxy s ~> Proxy s) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Proxy

SuppressUnusedWarnings (TFHelper_6989586621680787214Sym0 :: TyFun (Proxy s) (Proxy s ~> Bool) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Proxy

SuppressUnusedWarnings (Succ_6989586621680787246Sym0 :: TyFun (Proxy s) (Proxy s) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Proxy

SuppressUnusedWarnings (Pred_6989586621680787252Sym0 :: TyFun (Proxy s) (Proxy s) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Proxy

SuppressUnusedWarnings (FromEnum_6989586621680787258Sym0 :: TyFun (Proxy s) Nat -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Proxy

SuppressUnusedWarnings (EnumFromTo_6989586621680787289Sym0 :: TyFun (Proxy s) (Proxy s ~> [Proxy s]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Proxy

SuppressUnusedWarnings (EnumFromThenTo_6989586621680787278Sym0 :: TyFun (Proxy s) (Proxy s ~> (Proxy s ~> [Proxy s])) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Proxy

SuppressUnusedWarnings (Compare_6989586621680787223Sym0 :: TyFun (Proxy s) (Proxy s ~> Ordering) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Proxy

SuppressUnusedWarnings (Sconcat_6989586621680787306Sym0 :: TyFun (NonEmpty (Proxy s)) (Proxy s) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Proxy

SuppressUnusedWarnings (Foldr_6989586621680823452Sym0 :: TyFun (a ~> (b ~> b)) (b ~> (Proxy a ~> b)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (Foldl_6989586621680823465Sym0 :: TyFun (b ~> (a ~> b)) (b ~> (Proxy a ~> b)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (FoldMap_6989586621680823436Sym0 :: TyFun (a ~> m) (Proxy a ~> m) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (Fmap_6989586621680787322Sym0 :: TyFun (a ~> b) (Proxy a ~> Proxy b) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Proxy

SuppressUnusedWarnings (Foldr_6989586621680823452Sym1 a6989586621680823458 :: TyFun b (Proxy a ~> b) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (Foldl_6989586621680823465Sym1 a6989586621680823471 :: TyFun b (Proxy a ~> b) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (FoldMap_6989586621680823436Sym1 a6989586621680823441 :: TyFun (Proxy a) m -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (TFHelper_6989586621680787358Sym0 :: TyFun (Proxy a) ((a ~> Proxy b) ~> Proxy b) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Proxy

SuppressUnusedWarnings (TFHelper_6989586621680787337Sym1 a6989586621680787342 :: TyFun (Proxy a) (Proxy b) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Proxy

SuppressUnusedWarnings (Fmap_6989586621680787322Sym1 a6989586621680787327 :: TyFun (Proxy a) (Proxy b) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Proxy

SuppressUnusedWarnings (TFHelper_6989586621680787349Sym1 a6989586621680787354 :: TyFun (Proxy a) (Proxy a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Proxy

SuppressUnusedWarnings (TFHelper_6989586621680787298Sym1 a6989586621680787303 :: TyFun (Proxy s) (Proxy s) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Proxy

SuppressUnusedWarnings (TFHelper_6989586621680787214Sym1 a6989586621680787219 :: TyFun (Proxy s) Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Proxy

SuppressUnusedWarnings (ShowsPrec_6989586621680787233Sym1 a6989586621680787241 :: TyFun (Proxy s) (Symbol ~> Symbol) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Proxy

SuppressUnusedWarnings (EnumFromTo_6989586621680787289Sym1 a6989586621680787294 :: TyFun (Proxy s) [Proxy s] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Proxy

SuppressUnusedWarnings (EnumFromThenTo_6989586621680787278Sym1 a6989586621680787284 :: TyFun (Proxy s) (Proxy s ~> [Proxy s]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Proxy

SuppressUnusedWarnings (Compare_6989586621680787223Sym1 a6989586621680787228 :: TyFun (Proxy s) Ordering -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Proxy

SuppressUnusedWarnings (Traverse_6989586621681088365Sym0 :: TyFun (a ~> f b) (Proxy a ~> f (Proxy b)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

SuppressUnusedWarnings (MapM_6989586621681088380Sym0 :: TyFun (a ~> m b) (Proxy a ~> m (Proxy b)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

SuppressUnusedWarnings (Traverse_6989586621681088365Sym1 a6989586621681088370 :: TyFun (Proxy a) (f (Proxy b)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

SuppressUnusedWarnings (MapM_6989586621681088380Sym1 a6989586621681088385 :: TyFun (Proxy a) (m (Proxy b)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

SuppressUnusedWarnings (Foldr_6989586621680823452Sym2 a6989586621680823458 a6989586621680823459 :: TyFun (Proxy a) b -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (Foldl_6989586621680823465Sym2 a6989586621680823471 a6989586621680823472 :: TyFun (Proxy a) b -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (EnumFromThenTo_6989586621680787278Sym2 a6989586621680787284 a6989586621680787285 :: TyFun (Proxy s) [Proxy s] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Proxy

SuppressUnusedWarnings (TFHelper_6989586621680787358Sym1 a6989586621680787363 :: TyFun (a ~> Proxy b) (Proxy b) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Proxy

type MapM (a2 :: a1 ~> m b) (a3 :: Proxy a1) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type MapM (a2 :: a1 ~> m b) (a3 :: Proxy a1) = Apply (Apply (MapM_6989586621681088380Sym0 :: TyFun (a1 ~> m b) (Proxy a1 ~> m (Proxy b)) -> Type) a2) a3
type Traverse (a2 :: a1 ~> f b) (a3 :: Proxy a1) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type Traverse (a2 :: a1 ~> f b) (a3 :: Proxy a1) = Apply (Apply (Traverse_6989586621681088365Sym0 :: TyFun (a1 ~> f b) (Proxy a1 ~> f (Proxy b)) -> Type) a2) a3
type LiftA2 (arg1 :: a ~> (b ~> c)) (arg2 :: Proxy a) (arg3 :: Proxy b) 
Instance details

Defined in Data.Singletons.Prelude.Proxy

type LiftA2 (arg1 :: a ~> (b ~> c)) (arg2 :: Proxy a) (arg3 :: Proxy b) = Apply (Apply (Apply (LiftA2_6989586621680011983Sym0 :: TyFun (a ~> (b ~> c)) (Proxy a ~> (Proxy b ~> Proxy c)) -> Type) arg1) arg2) arg3
type FoldMap (a2 :: a1 ~> k2) (a3 :: Proxy a1) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type FoldMap (a2 :: a1 ~> k2) (a3 :: Proxy a1) = Apply (Apply (FoldMap_6989586621680823436Sym0 :: TyFun (a1 ~> k2) (Proxy a1 ~> k2) -> Type) a2) a3
type Fmap (a2 :: a1 ~> b) (a3 :: Proxy a1) 
Instance details

Defined in Data.Singletons.Prelude.Proxy

type Fmap (a2 :: a1 ~> b) (a3 :: Proxy a1) = Apply (Apply (Fmap_6989586621680787322Sym0 :: TyFun (a1 ~> b) (Proxy a1 ~> Proxy b) -> Type) a2) a3
type Foldl (a2 :: k2 ~> (a1 ~> k2)) (a3 :: k2) (a4 :: Proxy a1) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Foldl (a2 :: k2 ~> (a1 ~> k2)) (a3 :: k2) (a4 :: Proxy a1) = Apply (Apply (Apply (Foldl_6989586621680823465Sym0 :: TyFun (k2 ~> (a1 ~> k2)) (k2 ~> (Proxy a1 ~> k2)) -> Type) a2) a3) a4
type Foldr (a2 :: a1 ~> (k2 ~> k2)) (a3 :: k2) (a4 :: Proxy a1) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Foldr (a2 :: a1 ~> (k2 ~> k2)) (a3 :: k2) (a4 :: Proxy a1) = Apply (Apply (Apply (Foldr_6989586621680823452Sym0 :: TyFun (a1 ~> (k2 ~> k2)) (k2 ~> (Proxy a1 ~> k2)) -> Type) a2) a3) a4
type Foldl' (arg1 :: b ~> (a ~> b)) (arg2 :: b) (arg3 :: Proxy a) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Foldl' (arg1 :: b ~> (a ~> b)) (arg2 :: b) (arg3 :: Proxy a) = Apply (Apply (Apply (Foldl'_6989586621680822913Sym0 :: TyFun (b ~> (a ~> b)) (b ~> (Proxy a ~> b)) -> Type) arg1) arg2) arg3
type Foldr' (arg1 :: a ~> (b ~> b)) (arg2 :: b) (arg3 :: Proxy a) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Foldr' (arg1 :: a ~> (b ~> b)) (arg2 :: b) (arg3 :: Proxy a) = Apply (Apply (Apply (Foldr'_6989586621680822875Sym0 :: TyFun (a ~> (b ~> b)) (b ~> (Proxy a ~> b)) -> Type) arg1) arg2) arg3
type Rep1 (Proxy :: k -> Type) 
Instance details

Defined in GHC.Generics

type Rep1 (Proxy :: k -> Type) = D1 ('MetaData "Proxy" "Data.Proxy" "base" 'False) (C1 ('MetaCons "Proxy" 'PrefixI 'False) (U1 :: k -> Type))
type Pure (a :: k1) 
Instance details

Defined in Data.Singletons.Prelude.Proxy

type Pure (a :: k1) = Apply (Pure_6989586621680787330Sym0 :: TyFun k1 (Proxy k1) -> Type) a
type Return (arg :: a) 
Instance details

Defined in Data.Singletons.Prelude.Proxy

type Return (arg :: a) = Apply (Return_6989586621680012055Sym0 :: TyFun a (Proxy a) -> Type) arg
type Mzero 
Instance details

Defined in Data.Singletons.Prelude.Proxy

type Mzero = Mzero_6989586621680012075Sym0 :: Proxy a
type Empty 
Instance details

Defined in Data.Singletons.Prelude.Proxy

type Empty = Empty_6989586621680787344Sym0 :: Proxy a
type Elem (a1 :: k1) (a2 :: Proxy k1) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Elem (a1 :: k1) (a2 :: Proxy k1) = Apply (Apply (Elem_6989586621680823507Sym0 :: TyFun k1 (Proxy k1 ~> Bool) -> Type) a1) a2
type Foldl1 (a1 :: k2 ~> (k2 ~> k2)) (a2 :: Proxy k2) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Foldl1 (a1 :: k2 ~> (k2 ~> k2)) (a2 :: Proxy k2) = Apply (Apply (Foldl1_6989586621680823477Sym0 :: TyFun (k2 ~> (k2 ~> k2)) (Proxy k2 ~> k2) -> Type) a1) a2
type Foldr1 (a1 :: k2 ~> (k2 ~> k2)) (a2 :: Proxy k2) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Foldr1 (a1 :: k2 ~> (k2 ~> k2)) (a2 :: Proxy k2) = Apply (Apply (Foldr1_6989586621680823486Sym0 :: TyFun (k2 ~> (k2 ~> k2)) (Proxy k2 ~> k2) -> Type) a1) a2
type (arg1 :: a) <$ (arg2 :: Proxy b) 
Instance details

Defined in Data.Singletons.Prelude.Proxy

type (arg1 :: a) <$ (arg2 :: Proxy b) = Apply (Apply (TFHelper_6989586621680011927Sym0 :: TyFun a (Proxy b ~> Proxy a) -> Type) arg1) arg2
type Mplus (arg1 :: Proxy a) (arg2 :: Proxy a) 
Instance details

Defined in Data.Singletons.Prelude.Proxy

type Mplus (arg1 :: Proxy a) (arg2 :: Proxy a) = Apply (Apply (Mplus_6989586621680012080Sym0 :: TyFun (Proxy a) (Proxy a ~> Proxy a) -> Type) arg1) arg2
type (a2 :: Proxy a1) <|> (a3 :: Proxy a1) 
Instance details

Defined in Data.Singletons.Prelude.Proxy

type (a2 :: Proxy a1) <|> (a3 :: Proxy a1) = Apply (Apply (TFHelper_6989586621680787349Sym0 :: TyFun (Proxy a1) (Proxy a1 ~> Proxy a1) -> Type) a2) a3
type Apply (Elem_6989586621680823507Sym0 :: TyFun a (Proxy a ~> Bool) -> Type) (a6989586621680823512 :: a) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Elem_6989586621680823507Sym0 :: TyFun a (Proxy a ~> Bool) -> Type) (a6989586621680823512 :: a) = Elem_6989586621680823507Sym1 a6989586621680823512
type Apply (Pure_6989586621680787330Sym0 :: TyFun a (Proxy a) -> Type) (a6989586621680787334 :: a) 
Instance details

Defined in Data.Singletons.Prelude.Proxy

type Apply (Pure_6989586621680787330Sym0 :: TyFun a (Proxy a) -> Type) (a6989586621680787334 :: a) = Pure_6989586621680787330Sym1 a6989586621680787334
type Apply (ToEnum_6989586621680787264Sym0 :: TyFun Nat (Proxy s) -> Type) (a6989586621680787268 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Proxy

type Apply (ToEnum_6989586621680787264Sym0 :: TyFun Nat (Proxy s) -> Type) (a6989586621680787268 :: Nat) = ToEnum_6989586621680787264Sym1 a6989586621680787268 :: Proxy s
type Apply (ShowsPrec_6989586621680787233Sym0 :: TyFun Nat (Proxy s ~> (Symbol ~> Symbol)) -> Type) (a6989586621680787241 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Proxy

type Apply (ShowsPrec_6989586621680787233Sym0 :: TyFun Nat (Proxy s ~> (Symbol ~> Symbol)) -> Type) (a6989586621680787241 :: Nat) = ShowsPrec_6989586621680787233Sym1 a6989586621680787241 :: TyFun (Proxy s) (Symbol ~> Symbol) -> Type
type Apply (Foldr_6989586621680823452Sym1 a6989586621680823458 :: TyFun b (Proxy a ~> b) -> Type) (a6989586621680823459 :: b) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Foldr_6989586621680823452Sym1 a6989586621680823458 :: TyFun b (Proxy a ~> b) -> Type) (a6989586621680823459 :: b) = Foldr_6989586621680823452Sym2 a6989586621680823458 a6989586621680823459
type Apply (Foldl_6989586621680823465Sym1 a6989586621680823471 :: TyFun b (Proxy a ~> b) -> Type) (a6989586621680823472 :: b) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Foldl_6989586621680823465Sym1 a6989586621680823471 :: TyFun b (Proxy a ~> b) -> Type) (a6989586621680823472 :: b) = Foldl_6989586621680823465Sym2 a6989586621680823471 a6989586621680823472
type Rep (Proxy :: Type -> Type) 
Instance details

Defined in Data.Functor.Rep

type Rep (Proxy :: Type -> Type) = Void
type Key (Proxy :: Type -> Type) 
Instance details

Defined in Data.Key

type Key (Proxy :: Type -> Type) = Void
type Dom (Proxy :: Type -> Type) a 
Instance details

Defined in Control.Subcategory.Functor

type Dom (Proxy :: Type -> Type) a = ()
type Maximum (arg :: Proxy a) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Maximum (arg :: Proxy a) = Apply (Maximum_6989586621680823035Sym0 :: TyFun (Proxy a) a -> Type) arg
type Minimum (arg :: Proxy a) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Minimum (arg :: Proxy a) = Apply (Minimum_6989586621680823050Sym0 :: TyFun (Proxy a) a -> Type) arg
type Null (a2 :: Proxy a1) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Null (a2 :: Proxy a1) = Apply (Null_6989586621680823500Sym0 :: TyFun (Proxy a1) Bool -> Type) a2
type Product (a :: Proxy k2) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Product (a :: Proxy k2) = Apply (Product_6989586621680823521Sym0 :: TyFun (Proxy k2) k2 -> Type) a
type Sum (a :: Proxy k2) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Sum (a :: Proxy k2) = Apply (Sum_6989586621680823515Sym0 :: TyFun (Proxy k2) k2 -> Type) a
type Fold (a :: Proxy k2) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Fold (a :: Proxy k2) = Apply (Fold_6989586621680823444Sym0 :: TyFun (Proxy k2) k2 -> Type) a
type Length (a2 :: Proxy a1) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Length (a2 :: Proxy a1) = Apply (Length_6989586621680823494Sym0 :: TyFun (Proxy a1) Nat -> Type) a2
type ToList (arg :: Proxy a) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type ToList (arg :: Proxy a) = Apply (ToList_6989586621680822976Sym0 :: TyFun (Proxy a) [a] -> Type) arg
type Sequence (a2 :: Proxy (m a1)) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type Sequence (a2 :: Proxy (m a1)) = Apply (Sequence_6989586621681088388Sym0 :: TyFun (Proxy (m a1)) (m (Proxy a1)) -> Type) a2
type SequenceA (a2 :: Proxy (f a1)) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type SequenceA (a2 :: Proxy (f a1)) = Apply (SequenceA_6989586621681088373Sym0 :: TyFun (Proxy (f a1)) (f (Proxy a1)) -> Type) a2
type (arg1 :: Proxy a) *> (arg2 :: Proxy b) 
Instance details

Defined in Data.Singletons.Prelude.Proxy

type (arg1 :: Proxy a) *> (arg2 :: Proxy b) = Apply (Apply (TFHelper_6989586621680011999Sym0 :: TyFun (Proxy a) (Proxy b ~> Proxy b) -> Type) arg1) arg2
type (arg1 :: Proxy a) <* (arg2 :: Proxy b) 
Instance details

Defined in Data.Singletons.Prelude.Proxy

type (arg1 :: Proxy a) <* (arg2 :: Proxy b) = Apply (Apply (TFHelper_6989586621680012010Sym0 :: TyFun (Proxy a) (Proxy b ~> Proxy a) -> Type) arg1) arg2
type (a2 :: Proxy (a1 ~> b)) <*> (a3 :: Proxy a1) 
Instance details

Defined in Data.Singletons.Prelude.Proxy

type (a2 :: Proxy (a1 ~> b)) <*> (a3 :: Proxy a1) = Apply (Apply (TFHelper_6989586621680787337Sym0 :: TyFun (Proxy (a1 ~> b)) (Proxy a1 ~> Proxy b) -> Type) a2) a3
type (arg1 :: Proxy a) >> (arg2 :: Proxy b) 
Instance details

Defined in Data.Singletons.Prelude.Proxy

type (arg1 :: Proxy a) >> (arg2 :: Proxy b) = Apply (Apply (TFHelper_6989586621680012038Sym0 :: TyFun (Proxy a) (Proxy b ~> Proxy b) -> Type) arg1) arg2
type (a2 :: Proxy a1) >>= (a3 :: a1 ~> Proxy b) 
Instance details

Defined in Data.Singletons.Prelude.Proxy

type (a2 :: Proxy a1) >>= (a3 :: a1 ~> Proxy b) = Apply (Apply (TFHelper_6989586621680787358Sym0 :: TyFun (Proxy a1) ((a1 ~> Proxy b) ~> Proxy b) -> Type) a2) a3
type Apply (Mconcat_6989586621680787315Sym0 :: TyFun [Proxy s] (Proxy s) -> Type) (a6989586621680787319 :: [Proxy s]) 
Instance details

Defined in Data.Singletons.Prelude.Proxy

type Apply (Mconcat_6989586621680787315Sym0 :: TyFun [Proxy s] (Proxy s) -> Type) (a6989586621680787319 :: [Proxy s]) = Mconcat_6989586621680787315Sym1 a6989586621680787319
type Apply (Sconcat_6989586621680787306Sym0 :: TyFun (NonEmpty (Proxy s)) (Proxy s) -> Type) (a6989586621680787310 :: NonEmpty (Proxy s)) 
Instance details

Defined in Data.Singletons.Prelude.Proxy

type Apply (Sconcat_6989586621680787306Sym0 :: TyFun (NonEmpty (Proxy s)) (Proxy s) -> Type) (a6989586621680787310 :: NonEmpty (Proxy s)) = Sconcat_6989586621680787306Sym1 a6989586621680787310
type Rep (Proxy t) 
Instance details

Defined in GHC.Generics

type Rep (Proxy t) = D1 ('MetaData "Proxy" "Data.Proxy" "base" 'False) (C1 ('MetaCons "Proxy" 'PrefixI 'False) (U1 :: Type -> Type))
type Demote (Proxy t) 
Instance details

Defined in Data.Singletons.Prelude.Proxy

type Demote (Proxy t) = Proxy t
type Sing 
Instance details

Defined in Data.Singletons.Prelude.Proxy

type Sing = SProxy :: Proxy t -> Type
type MaxBound 
Instance details

Defined in Data.Singletons.Prelude.Proxy

type MaxBound = MaxBound_6989586621680787209Sym0 :: Proxy s
type MinBound 
Instance details

Defined in Data.Singletons.Prelude.Proxy

type MinBound = MinBound_6989586621680787206Sym0 :: Proxy s
type Mempty 
Instance details

Defined in Data.Singletons.Prelude.Proxy

type Mempty = Mempty_6989586621680787311Sym0 :: Proxy s
type Element (Proxy a) 
Instance details

Defined in Data.MonoTraversable

type Element (Proxy a) = a
type FromEnum (a :: Proxy s) 
Instance details

Defined in Data.Singletons.Prelude.Proxy

type FromEnum (a :: Proxy s) = Apply (FromEnum_6989586621680787258Sym0 :: TyFun (Proxy s) Nat -> Type) a
type ToEnum a 
Instance details

Defined in Data.Singletons.Prelude.Proxy

type ToEnum a = Apply (ToEnum_6989586621680787264Sym0 :: TyFun Nat (Proxy s) -> Type) a
type Mconcat (a :: [Proxy s]) 
Instance details

Defined in Data.Singletons.Prelude.Proxy

type Mconcat (a :: [Proxy s]) = Apply (Mconcat_6989586621680787315Sym0 :: TyFun [Proxy s] (Proxy s) -> Type) a
type Show_ (arg :: Proxy s) 
Instance details

Defined in Data.Singletons.Prelude.Proxy

type Show_ (arg :: Proxy s) = Apply (Show__6989586621680636786Sym0 :: TyFun (Proxy s) Symbol -> Type) arg
type Pred (a :: Proxy s) 
Instance details

Defined in Data.Singletons.Prelude.Proxy

type Pred (a :: Proxy s) = Apply (Pred_6989586621680787252Sym0 :: TyFun (Proxy s) (Proxy s) -> Type) a
type Succ (a :: Proxy s) 
Instance details

Defined in Data.Singletons.Prelude.Proxy

type Succ (a :: Proxy s) = Apply (Succ_6989586621680787246Sym0 :: TyFun (Proxy s) (Proxy s) -> Type) a
type Sconcat (a :: NonEmpty (Proxy s)) 
Instance details

Defined in Data.Singletons.Prelude.Proxy

type Sconcat (a :: NonEmpty (Proxy s)) = Apply (Sconcat_6989586621680787306Sym0 :: TyFun (NonEmpty (Proxy s)) (Proxy s) -> Type) a
type EnumFromTo (a1 :: Proxy s) (a2 :: Proxy s) 
Instance details

Defined in Data.Singletons.Prelude.Proxy

type EnumFromTo (a1 :: Proxy s) (a2 :: Proxy s) = Apply (Apply (EnumFromTo_6989586621680787289Sym0 :: TyFun (Proxy s) (Proxy s ~> [Proxy s]) -> Type) a1) a2
type (x :: Proxy s) /= (y :: Proxy s) 
Instance details

Defined in Data.Singletons.Prelude.Proxy

type (x :: Proxy s) /= (y :: Proxy s) = Not (x == y)
type (a1 :: Proxy s) == (a2 :: Proxy s) 
Instance details

Defined in Data.Singletons.Prelude.Proxy

type (a1 :: Proxy s) == (a2 :: Proxy s) = Apply (Apply (TFHelper_6989586621680787214Sym0 :: TyFun (Proxy s) (Proxy s ~> Bool) -> Type) a1) a2
type Mappend (arg1 :: Proxy s) (arg2 :: Proxy s) 
Instance details

Defined in Data.Singletons.Prelude.Proxy

type Mappend (arg1 :: Proxy s) (arg2 :: Proxy s) = Apply (Apply (Mappend_6989586621680691371Sym0 :: TyFun (Proxy s) (Proxy s ~> Proxy s) -> Type) arg1) arg2
type (arg1 :: Proxy s) < (arg2 :: Proxy s) 
Instance details

Defined in Data.Singletons.Prelude.Proxy

type (arg1 :: Proxy s) < (arg2 :: Proxy s) = Apply (Apply (TFHelper_6989586621679837447Sym0 :: TyFun (Proxy s) (Proxy s ~> Bool) -> Type) arg1) arg2
type (arg1 :: Proxy s) <= (arg2 :: Proxy s) 
Instance details

Defined in Data.Singletons.Prelude.Proxy

type (arg1 :: Proxy s) <= (arg2 :: Proxy s) = Apply (Apply (TFHelper_6989586621679837463Sym0 :: TyFun (Proxy s) (Proxy s ~> Bool) -> Type) arg1) arg2
type (arg1 :: Proxy s) > (arg2 :: Proxy s) 
Instance details

Defined in Data.Singletons.Prelude.Proxy

type (arg1 :: Proxy s) > (arg2 :: Proxy s) = Apply (Apply (TFHelper_6989586621679837479Sym0 :: TyFun (Proxy s) (Proxy s ~> Bool) -> Type) arg1) arg2
type (arg1 :: Proxy s) >= (arg2 :: Proxy s) 
Instance details

Defined in Data.Singletons.Prelude.Proxy

type (arg1 :: Proxy s) >= (arg2 :: Proxy s) = Apply (Apply (TFHelper_6989586621679837495Sym0 :: TyFun (Proxy s) (Proxy s ~> Bool) -> Type) arg1) arg2
type Compare (a1 :: Proxy s) (a2 :: Proxy s) 
Instance details

Defined in Data.Singletons.Prelude.Proxy

type Compare (a1 :: Proxy s) (a2 :: Proxy s) = Apply (Apply (Compare_6989586621680787223Sym0 :: TyFun (Proxy s) (Proxy s ~> Ordering) -> Type) a1) a2
type Max (arg1 :: Proxy s) (arg2 :: Proxy s) 
Instance details

Defined in Data.Singletons.Prelude.Proxy

type Max (arg1 :: Proxy s) (arg2 :: Proxy s) = Apply (Apply (Max_6989586621679837511Sym0 :: TyFun (Proxy s) (Proxy s ~> Proxy s) -> Type) arg1) arg2
type Min (arg1 :: Proxy s) (arg2 :: Proxy s) 
Instance details

Defined in Data.Singletons.Prelude.Proxy

type Min (arg1 :: Proxy s) (arg2 :: Proxy s) = Apply (Apply (Min_6989586621679837527Sym0 :: TyFun (Proxy s) (Proxy s ~> Proxy s) -> Type) arg1) arg2
type (a1 :: Proxy s) <> (a2 :: Proxy s) 
Instance details

Defined in Data.Singletons.Prelude.Proxy

type (a1 :: Proxy s) <> (a2 :: Proxy s) = Apply (Apply (TFHelper_6989586621680787298Sym0 :: TyFun (Proxy s) (Proxy s ~> Proxy s) -> Type) a1) a2
type ShowList (arg1 :: [Proxy s]) arg2 
Instance details

Defined in Data.Singletons.Prelude.Proxy

type ShowList (arg1 :: [Proxy s]) arg2 = Apply (Apply (ShowList_6989586621680636794Sym0 :: TyFun [Proxy s] (Symbol ~> Symbol) -> Type) arg1) arg2
type EnumFromThenTo (a1 :: Proxy s) (a2 :: Proxy s) (a3 :: Proxy s) 
Instance details

Defined in Data.Singletons.Prelude.Proxy

type EnumFromThenTo (a1 :: Proxy s) (a2 :: Proxy s) (a3 :: Proxy s) = Apply (Apply (Apply (EnumFromThenTo_6989586621680787278Sym0 :: TyFun (Proxy s) (Proxy s ~> (Proxy s ~> [Proxy s])) -> Type) a1) a2) a3
type ShowsPrec a1 (a2 :: Proxy s) a3 
Instance details

Defined in Data.Singletons.Prelude.Proxy

type ShowsPrec a1 (a2 :: Proxy s) a3 = Apply (Apply (Apply (ShowsPrec_6989586621680787233Sym0 :: TyFun Nat (Proxy s ~> (Symbol ~> Symbol)) -> Type) a1) a2) a3
type Apply (Fold_6989586621680823444Sym0 :: TyFun (Proxy m) m -> Type) (a6989586621680823448 :: Proxy m) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Fold_6989586621680823444Sym0 :: TyFun (Proxy m) m -> Type) (a6989586621680823448 :: Proxy m) = Fold_6989586621680823444Sym1 a6989586621680823448
type Apply (Sum_6989586621680823515Sym0 :: TyFun (Proxy a) a -> Type) (a6989586621680823519 :: Proxy a) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Sum_6989586621680823515Sym0 :: TyFun (Proxy a) a -> Type) (a6989586621680823519 :: Proxy a) = Sum_6989586621680823515Sym1 a6989586621680823519
type Apply (Product_6989586621680823521Sym0 :: TyFun (Proxy a) a -> Type) (a6989586621680823525 :: Proxy a) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Product_6989586621680823521Sym0 :: TyFun (Proxy a) a -> Type) (a6989586621680823525 :: Proxy a) = Product_6989586621680823521Sym1 a6989586621680823525
type Apply (Foldl1_6989586621680823477Sym1 a6989586621680823482 :: TyFun (Proxy a) a -> Type) (a6989586621680823483 :: Proxy a) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Foldl1_6989586621680823477Sym1 a6989586621680823482 :: TyFun (Proxy a) a -> Type) (a6989586621680823483 :: Proxy a) = Foldl1_6989586621680823477Sym2 a6989586621680823482 a6989586621680823483
type Apply (Foldr1_6989586621680823486Sym1 a6989586621680823491 :: TyFun (Proxy a) a -> Type) (a6989586621680823492 :: Proxy a) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Foldr1_6989586621680823486Sym1 a6989586621680823491 :: TyFun (Proxy a) a -> Type) (a6989586621680823492 :: Proxy a) = Foldr1_6989586621680823486Sym2 a6989586621680823491 a6989586621680823492
type Apply (Elem_6989586621680823507Sym1 a6989586621680823512 :: TyFun (Proxy a) Bool -> Type) (a6989586621680823513 :: Proxy a) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Elem_6989586621680823507Sym1 a6989586621680823512 :: TyFun (Proxy a) Bool -> Type) (a6989586621680823513 :: Proxy a) = Elem_6989586621680823507Sym2 a6989586621680823512 a6989586621680823513
type Apply (Length_6989586621680823494Sym0 :: TyFun (Proxy a) Nat -> Type) (a6989586621680823498 :: Proxy a) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Length_6989586621680823494Sym0 :: TyFun (Proxy a) Nat -> Type) (a6989586621680823498 :: Proxy a) = Length_6989586621680823494Sym1 a6989586621680823498
type Apply (Null_6989586621680823500Sym0 :: TyFun (Proxy a) Bool -> Type) (a6989586621680823504 :: Proxy a) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Null_6989586621680823500Sym0 :: TyFun (Proxy a) Bool -> Type) (a6989586621680823504 :: Proxy a) = Null_6989586621680823500Sym1 a6989586621680823504
type Apply (FromEnum_6989586621680787258Sym0 :: TyFun (Proxy s) Nat -> Type) (a6989586621680787262 :: Proxy s) 
Instance details

Defined in Data.Singletons.Prelude.Proxy

type Apply (FromEnum_6989586621680787258Sym0 :: TyFun (Proxy s) Nat -> Type) (a6989586621680787262 :: Proxy s) = FromEnum_6989586621680787258Sym1 a6989586621680787262
type Apply (FoldMap_6989586621680823436Sym1 a6989586621680823441 :: TyFun (Proxy a) m -> Type) (a6989586621680823442 :: Proxy a) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (FoldMap_6989586621680823436Sym1 a6989586621680823441 :: TyFun (Proxy a) m -> Type) (a6989586621680823442 :: Proxy a) = FoldMap_6989586621680823436Sym2 a6989586621680823441 a6989586621680823442
type Apply (TFHelper_6989586621680787214Sym1 a6989586621680787219 :: TyFun (Proxy s) Bool -> Type) (a6989586621680787220 :: Proxy s) 
Instance details

Defined in Data.Singletons.Prelude.Proxy

type Apply (TFHelper_6989586621680787214Sym1 a6989586621680787219 :: TyFun (Proxy s) Bool -> Type) (a6989586621680787220 :: Proxy s) = TFHelper_6989586621680787214Sym2 a6989586621680787219 a6989586621680787220
type Apply (Compare_6989586621680787223Sym1 a6989586621680787228 :: TyFun (Proxy s) Ordering -> Type) (a6989586621680787229 :: Proxy s) 
Instance details

Defined in Data.Singletons.Prelude.Proxy

type Apply (Compare_6989586621680787223Sym1 a6989586621680787228 :: TyFun (Proxy s) Ordering -> Type) (a6989586621680787229 :: Proxy s) = Compare_6989586621680787223Sym2 a6989586621680787228 a6989586621680787229
type Apply (Foldr_6989586621680823452Sym2 a6989586621680823458 a6989586621680823459 :: TyFun (Proxy a) b -> Type) (a6989586621680823460 :: Proxy a) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Foldr_6989586621680823452Sym2 a6989586621680823458 a6989586621680823459 :: TyFun (Proxy a) b -> Type) (a6989586621680823460 :: Proxy a) = Foldr_6989586621680823452Sym3 a6989586621680823458 a6989586621680823459 a6989586621680823460
type Apply (Foldl_6989586621680823465Sym2 a6989586621680823471 a6989586621680823472 :: TyFun (Proxy a) b -> Type) (a6989586621680823473 :: Proxy a) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Foldl_6989586621680823465Sym2 a6989586621680823471 a6989586621680823472 :: TyFun (Proxy a) b -> Type) (a6989586621680823473 :: Proxy a) = Foldl_6989586621680823465Sym3 a6989586621680823471 a6989586621680823472 a6989586621680823473
type Apply (SequenceA_6989586621681088373Sym0 :: TyFun (Proxy (f a)) (f (Proxy a)) -> Type) (a6989586621681088377 :: Proxy (f a)) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type Apply (SequenceA_6989586621681088373Sym0 :: TyFun (Proxy (f a)) (f (Proxy a)) -> Type) (a6989586621681088377 :: Proxy (f a)) = SequenceA_6989586621681088373Sym1 a6989586621681088377
type Apply (Sequence_6989586621681088388Sym0 :: TyFun (Proxy (m a)) (m (Proxy a)) -> Type) (a6989586621681088392 :: Proxy (m a)) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type Apply (Sequence_6989586621681088388Sym0 :: TyFun (Proxy (m a)) (m (Proxy a)) -> Type) (a6989586621681088392 :: Proxy (m a)) = Sequence_6989586621681088388Sym1 a6989586621681088392
type Apply (EnumFromTo_6989586621680787289Sym1 a6989586621680787294 :: TyFun (Proxy s) [Proxy s] -> Type) (a6989586621680787295 :: Proxy s) 
Instance details

Defined in Data.Singletons.Prelude.Proxy

type Apply (EnumFromTo_6989586621680787289Sym1 a6989586621680787294 :: TyFun (Proxy s) [Proxy s] -> Type) (a6989586621680787295 :: Proxy s) = EnumFromTo_6989586621680787289Sym2 a6989586621680787294 a6989586621680787295
type Apply (Traverse_6989586621681088365Sym1 a6989586621681088370 :: TyFun (Proxy a) (f (Proxy b)) -> Type) (a6989586621681088371 :: Proxy a) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type Apply (Traverse_6989586621681088365Sym1 a6989586621681088370 :: TyFun (Proxy a) (f (Proxy b)) -> Type) (a6989586621681088371 :: Proxy a) = Traverse_6989586621681088365Sym2 a6989586621681088370 a6989586621681088371
type Apply (MapM_6989586621681088380Sym1 a6989586621681088385 :: TyFun (Proxy a) (m (Proxy b)) -> Type) (a6989586621681088386 :: Proxy a) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type Apply (MapM_6989586621681088380Sym1 a6989586621681088385 :: TyFun (Proxy a) (m (Proxy b)) -> Type) (a6989586621681088386 :: Proxy a) = MapM_6989586621681088380Sym2 a6989586621681088385 a6989586621681088386
type Apply (EnumFromThenTo_6989586621680787278Sym2 a6989586621680787284 a6989586621680787285 :: TyFun (Proxy s) [Proxy s] -> Type) (a6989586621680787286 :: Proxy s) 
Instance details

Defined in Data.Singletons.Prelude.Proxy

type Apply (EnumFromThenTo_6989586621680787278Sym2 a6989586621680787284 a6989586621680787285 :: TyFun (Proxy s) [Proxy s] -> Type) (a6989586621680787286 :: Proxy s) = EnumFromThenTo_6989586621680787278Sym3 a6989586621680787284 a6989586621680787285 a6989586621680787286
type Apply (Foldl1_6989586621680823477Sym0 :: TyFun (a ~> (a ~> a)) (Proxy a ~> a) -> Type) (a6989586621680823482 :: a ~> (a ~> a)) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Foldl1_6989586621680823477Sym0 :: TyFun (a ~> (a ~> a)) (Proxy a ~> a) -> Type) (a6989586621680823482 :: a ~> (a ~> a)) = Foldl1_6989586621680823477Sym1 a6989586621680823482
type Apply (Foldr1_6989586621680823486Sym0 :: TyFun (a ~> (a ~> a)) (Proxy a ~> a) -> Type) (a6989586621680823491 :: a ~> (a ~> a)) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Foldr1_6989586621680823486Sym0 :: TyFun (a ~> (a ~> a)) (Proxy a ~> a) -> Type) (a6989586621680823491 :: a ~> (a ~> a)) = Foldr1_6989586621680823486Sym1 a6989586621680823491
type Apply (TFHelper_6989586621680787337Sym0 :: TyFun (Proxy (a ~> b)) (Proxy a ~> Proxy b) -> Type) (a6989586621680787342 :: Proxy (a ~> b)) 
Instance details

Defined in Data.Singletons.Prelude.Proxy

type Apply (TFHelper_6989586621680787337Sym0 :: TyFun (Proxy (a ~> b)) (Proxy a ~> Proxy b) -> Type) (a6989586621680787342 :: Proxy (a ~> b)) = TFHelper_6989586621680787337Sym1 a6989586621680787342
type Apply (TFHelper_6989586621680787214Sym0 :: TyFun (Proxy s) (Proxy s ~> Bool) -> Type) (a6989586621680787219 :: Proxy s) 
Instance details

Defined in Data.Singletons.Prelude.Proxy

type Apply (TFHelper_6989586621680787214Sym0 :: TyFun (Proxy s) (Proxy s ~> Bool) -> Type) (a6989586621680787219 :: Proxy s) = TFHelper_6989586621680787214Sym1 a6989586621680787219
type Apply (Compare_6989586621680787223Sym0 :: TyFun (Proxy s) (Proxy s ~> Ordering) -> Type) (a6989586621680787228 :: Proxy s) 
Instance details

Defined in Data.Singletons.Prelude.Proxy

type Apply (Compare_6989586621680787223Sym0 :: TyFun (Proxy s) (Proxy s ~> Ordering) -> Type) (a6989586621680787228 :: Proxy s) = Compare_6989586621680787223Sym1 a6989586621680787228
type Apply (Succ_6989586621680787246Sym0 :: TyFun (Proxy s) (Proxy s) -> Type) (a6989586621680787250 :: Proxy s) 
Instance details

Defined in Data.Singletons.Prelude.Proxy

type Apply (Succ_6989586621680787246Sym0 :: TyFun (Proxy s) (Proxy s) -> Type) (a6989586621680787250 :: Proxy s) = Succ_6989586621680787246Sym1 a6989586621680787250
type Apply (Pred_6989586621680787252Sym0 :: TyFun (Proxy s) (Proxy s) -> Type) (a6989586621680787256 :: Proxy s) 
Instance details

Defined in Data.Singletons.Prelude.Proxy

type Apply (Pred_6989586621680787252Sym0 :: TyFun (Proxy s) (Proxy s) -> Type) (a6989586621680787256 :: Proxy s) = Pred_6989586621680787252Sym1 a6989586621680787256
type Apply (EnumFromThenTo_6989586621680787278Sym0 :: TyFun (Proxy s) (Proxy s ~> (Proxy s ~> [Proxy s])) -> Type) (a6989586621680787284 :: Proxy s) 
Instance details

Defined in Data.Singletons.Prelude.Proxy

type Apply (EnumFromThenTo_6989586621680787278Sym0 :: TyFun (Proxy s) (Proxy s ~> (Proxy s ~> [Proxy s])) -> Type) (a6989586621680787284 :: Proxy s) = EnumFromThenTo_6989586621680787278Sym1 a6989586621680787284
type Apply (EnumFromTo_6989586621680787289Sym0 :: TyFun (Proxy s) (Proxy s ~> [Proxy s]) -> Type) (a6989586621680787294 :: Proxy s) 
Instance details

Defined in Data.Singletons.Prelude.Proxy

type Apply (EnumFromTo_6989586621680787289Sym0 :: TyFun (Proxy s) (Proxy s ~> [Proxy s]) -> Type) (a6989586621680787294 :: Proxy s) = EnumFromTo_6989586621680787289Sym1 a6989586621680787294
type Apply (TFHelper_6989586621680787298Sym0 :: TyFun (Proxy s) (Proxy s ~> Proxy s) -> Type) (a6989586621680787303 :: Proxy s) 
Instance details

Defined in Data.Singletons.Prelude.Proxy

type Apply (TFHelper_6989586621680787298Sym0 :: TyFun (Proxy s) (Proxy s ~> Proxy s) -> Type) (a6989586621680787303 :: Proxy s) = TFHelper_6989586621680787298Sym1 a6989586621680787303
type Apply (TFHelper_6989586621680787349Sym0 :: TyFun (Proxy a) (Proxy a ~> Proxy a) -> Type) (a6989586621680787354 :: Proxy a) 
Instance details

Defined in Data.Singletons.Prelude.Proxy

type Apply (TFHelper_6989586621680787349Sym0 :: TyFun (Proxy a) (Proxy a ~> Proxy a) -> Type) (a6989586621680787354 :: Proxy a) = TFHelper_6989586621680787349Sym1 a6989586621680787354
type Apply (FoldMap_6989586621680823436Sym0 :: TyFun (a ~> m) (Proxy a ~> m) -> Type) (a6989586621680823441 :: a ~> m) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (FoldMap_6989586621680823436Sym0 :: TyFun (a ~> m) (Proxy a ~> m) -> Type) (a6989586621680823441 :: a ~> m) = FoldMap_6989586621680823436Sym1 a6989586621680823441
type Apply (Foldr_6989586621680823452Sym0 :: TyFun (a ~> (b ~> b)) (b ~> (Proxy a ~> b)) -> Type) (a6989586621680823458 :: a ~> (b ~> b)) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Foldr_6989586621680823452Sym0 :: TyFun (a ~> (b ~> b)) (b ~> (Proxy a ~> b)) -> Type) (a6989586621680823458 :: a ~> (b ~> b)) = Foldr_6989586621680823452Sym1 a6989586621680823458
type Apply (Foldl_6989586621680823465Sym0 :: TyFun (b ~> (a ~> b)) (b ~> (Proxy a ~> b)) -> Type) (a6989586621680823471 :: b ~> (a ~> b)) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Foldl_6989586621680823465Sym0 :: TyFun (b ~> (a ~> b)) (b ~> (Proxy a ~> b)) -> Type) (a6989586621680823471 :: b ~> (a ~> b)) = Foldl_6989586621680823465Sym1 a6989586621680823471
type Apply (Fmap_6989586621680787322Sym0 :: TyFun (a ~> b) (Proxy a ~> Proxy b) -> Type) (a6989586621680787327 :: a ~> b) 
Instance details

Defined in Data.Singletons.Prelude.Proxy

type Apply (Fmap_6989586621680787322Sym0 :: TyFun (a ~> b) (Proxy a ~> Proxy b) -> Type) (a6989586621680787327 :: a ~> b) = Fmap_6989586621680787322Sym1 a6989586621680787327
type Apply (Fmap_6989586621680787322Sym1 a6989586621680787327 :: TyFun (Proxy a) (Proxy b) -> Type) (a6989586621680787328 :: Proxy a) 
Instance details

Defined in Data.Singletons.Prelude.Proxy

type Apply (Fmap_6989586621680787322Sym1 a6989586621680787327 :: TyFun (Proxy a) (Proxy b) -> Type) (a6989586621680787328 :: Proxy a) = Fmap_6989586621680787322Sym2 a6989586621680787327 a6989586621680787328
type Apply (TFHelper_6989586621680787337Sym1 a6989586621680787342 :: TyFun (Proxy a) (Proxy b) -> Type) (a6989586621680787343 :: Proxy a) 
Instance details

Defined in Data.Singletons.Prelude.Proxy

type Apply (TFHelper_6989586621680787337Sym1 a6989586621680787342 :: TyFun (Proxy a) (Proxy b) -> Type) (a6989586621680787343 :: Proxy a) = TFHelper_6989586621680787337Sym2 a6989586621680787342 a6989586621680787343
type Apply (TFHelper_6989586621680787358Sym0 :: TyFun (Proxy a) ((a ~> Proxy b) ~> Proxy b) -> Type) (a6989586621680787363 :: Proxy a) 
Instance details

Defined in Data.Singletons.Prelude.Proxy

type Apply (TFHelper_6989586621680787358Sym0 :: TyFun (Proxy a) ((a ~> Proxy b) ~> Proxy b) -> Type) (a6989586621680787363 :: Proxy a) = TFHelper_6989586621680787358Sym1 a6989586621680787363 :: TyFun (a ~> Proxy b) (Proxy b) -> Type
type Apply (ShowsPrec_6989586621680787233Sym1 a6989586621680787241 :: TyFun (Proxy s) (Symbol ~> Symbol) -> Type) (a6989586621680787242 :: Proxy s) 
Instance details

Defined in Data.Singletons.Prelude.Proxy

type Apply (ShowsPrec_6989586621680787233Sym1 a6989586621680787241 :: TyFun (Proxy s) (Symbol ~> Symbol) -> Type) (a6989586621680787242 :: Proxy s) = ShowsPrec_6989586621680787233Sym2 a6989586621680787241 a6989586621680787242
type Apply (EnumFromThenTo_6989586621680787278Sym1 a6989586621680787284 :: TyFun (Proxy s) (Proxy s ~> [Proxy s]) -> Type) (a6989586621680787285 :: Proxy s) 
Instance details

Defined in Data.Singletons.Prelude.Proxy

type Apply (EnumFromThenTo_6989586621680787278Sym1 a6989586621680787284 :: TyFun (Proxy s) (Proxy s ~> [Proxy s]) -> Type) (a6989586621680787285 :: Proxy s) = EnumFromThenTo_6989586621680787278Sym2 a6989586621680787284 a6989586621680787285
type Apply (TFHelper_6989586621680787298Sym1 a6989586621680787303 :: TyFun (Proxy s) (Proxy s) -> Type) (a6989586621680787304 :: Proxy s) 
Instance details

Defined in Data.Singletons.Prelude.Proxy

type Apply (TFHelper_6989586621680787298Sym1 a6989586621680787303 :: TyFun (Proxy s) (Proxy s) -> Type) (a6989586621680787304 :: Proxy s) = TFHelper_6989586621680787298Sym2 a6989586621680787303 a6989586621680787304
type Apply (TFHelper_6989586621680787349Sym1 a6989586621680787354 :: TyFun (Proxy a) (Proxy a) -> Type) (a6989586621680787355 :: Proxy a) 
Instance details

Defined in Data.Singletons.Prelude.Proxy

type Apply (TFHelper_6989586621680787349Sym1 a6989586621680787354 :: TyFun (Proxy a) (Proxy a) -> Type) (a6989586621680787355 :: Proxy a) = TFHelper_6989586621680787349Sym2 a6989586621680787354 a6989586621680787355
type Apply (Traverse_6989586621681088365Sym0 :: TyFun (a ~> f b) (Proxy a ~> f (Proxy b)) -> Type) (a6989586621681088370 :: a ~> f b) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type Apply (Traverse_6989586621681088365Sym0 :: TyFun (a ~> f b) (Proxy a ~> f (Proxy b)) -> Type) (a6989586621681088370 :: a ~> f b) = Traverse_6989586621681088365Sym1 a6989586621681088370
type Apply (MapM_6989586621681088380Sym0 :: TyFun (a ~> m b) (Proxy a ~> m (Proxy b)) -> Type) (a6989586621681088385 :: a ~> m b) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type Apply (MapM_6989586621681088380Sym0 :: TyFun (a ~> m b) (Proxy a ~> m (Proxy b)) -> Type) (a6989586621681088385 :: a ~> m b) = MapM_6989586621681088380Sym1 a6989586621681088385
type Apply (TFHelper_6989586621680787358Sym1 a6989586621680787363 :: TyFun (a ~> Proxy b) (Proxy b) -> Type) (a6989586621680787364 :: a ~> Proxy b) 
Instance details

Defined in Data.Singletons.Prelude.Proxy

type Apply (TFHelper_6989586621680787358Sym1 a6989586621680787363 :: TyFun (a ~> Proxy b) (Proxy b) -> Type) (a6989586621680787364 :: a ~> Proxy b) = TFHelper_6989586621680787358Sym2 a6989586621680787363 a6989586621680787364

data KProxy t #

A concrete, promotable proxy type, for use at the kind level. There are no instances for this because it is intended at the kind level only

Constructors

KProxy 

class KnownNat (n :: Nat) #

This class gives the integer associated with a type-level natural. There are instances of the class for every concrete literal: 0, 1, 2, etc.

Since: base-4.7.0.0

Minimal complete definition

natSing

data Nat #

(Kind) This is the kind of type-level natural numbers.

Instances

Instances details
PEnum Nat 
Instance details

Defined in Data.Singletons.Prelude.Enum

Associated Types

type Succ arg :: a

type Pred arg :: a

type ToEnum arg :: a

type FromEnum arg :: Nat

type EnumFromTo arg arg1 :: [a]

type EnumFromThenTo arg arg1 arg2 :: [a]

SEnum Nat 
Instance details

Defined in Data.Singletons.Prelude.Enum

Methods

sSucc :: forall (t :: Nat). Sing t -> Sing (Apply SuccSym0 t)

sPred :: forall (t :: Nat). Sing t -> Sing (Apply PredSym0 t)

sToEnum :: forall (t :: Nat). Sing t -> Sing (Apply ToEnumSym0 t)

sFromEnum :: forall (t :: Nat). Sing t -> Sing (Apply FromEnumSym0 t)

sEnumFromTo :: forall (t1 :: Nat) (t2 :: Nat). Sing t1 -> Sing t2 -> Sing (Apply (Apply EnumFromToSym0 t1) t2)

sEnumFromThenTo :: forall (t1 :: Nat) (t2 :: Nat) (t3 :: Nat). Sing t1 -> Sing t2 -> Sing t3 -> Sing (Apply (Apply (Apply EnumFromThenToSym0 t1) t2) t3)

PNum Nat 
Instance details

Defined in Data.Singletons.Prelude.Num

Associated Types

type arg + arg1 :: a

type arg - arg1 :: a

type arg * arg1 :: a

type Negate arg :: a

type Abs arg :: a

type Signum arg :: a

type FromInteger arg :: a

SNum Nat 
Instance details

Defined in Data.Singletons.Prelude.Num

Methods

(%+) :: forall (t1 :: Nat) (t2 :: Nat). Sing t1 -> Sing t2 -> Sing (Apply (Apply (+@#@$) t1) t2)

(%-) :: forall (t1 :: Nat) (t2 :: Nat). Sing t1 -> Sing t2 -> Sing (Apply (Apply (-@#@$) t1) t2)

(%*) :: forall (t1 :: Nat) (t2 :: Nat). Sing t1 -> Sing t2 -> Sing (Apply (Apply (*@#@$) t1) t2)

sNegate :: forall (t :: Nat). Sing t -> Sing (Apply NegateSym0 t)

sAbs :: forall (t :: Nat). Sing t -> Sing (Apply AbsSym0 t)

sSignum :: forall (t :: Nat). Sing t -> Sing (Apply SignumSym0 t)

sFromInteger :: forall (t :: Nat). Sing t -> Sing (Apply FromIntegerSym0 t)

PShow Nat 
Instance details

Defined in Data.Singletons.Prelude.Show

Associated Types

type ShowsPrec arg arg1 arg2 :: Symbol

type Show_ arg :: Symbol

type ShowList arg arg1 :: Symbol

SShow Nat 
Instance details

Defined in Data.Singletons.Prelude.Show

Methods

sShowsPrec :: forall (t1 :: Nat) (t2 :: Nat) (t3 :: Symbol). Sing t1 -> Sing t2 -> Sing t3 -> Sing (Apply (Apply (Apply ShowsPrecSym0 t1) t2) t3)

sShow_ :: forall (t :: Nat). Sing t -> Sing (Apply Show_Sym0 t)

sShowList :: forall (t1 :: [Nat]) (t2 :: Symbol). Sing t1 -> Sing t2 -> Sing (Apply (Apply ShowListSym0 t1) t2)

KnownNat n => HasResolution (n :: Nat)

For example, Fixed 1000 will give you a Fixed with a resolution of 1000.

Instance details

Defined in Data.Fixed

Methods

resolution :: p n -> Integer #

TestEquality SNat 
Instance details

Defined in Data.Type.Natural.Core

Methods

testEquality :: forall (a :: k) (b :: k). SNat a -> SNat b -> Maybe (a :~: b) #

KnownNat n => Reifies (n :: Nat) Integer 
Instance details

Defined in Data.Reflection

Methods

reflect :: proxy n -> Integer

(IsMonomialOrder k ord, ones ~ Replicate n 1, SingI ones, Length ones <= k, KnownNat k) => EliminationType k (n :: Nat) (WeightOrder ones ord) Source # 
Instance details

Defined in Algebra.Ring.Polynomial.Monomial

(KnownNat n, KnownNat m, IsMonomialOrder n ord, IsMonomialOrder m ord', k ~ (n + m), KnownNat k) => EliminationType k (n :: Nat) (ProductOrder n m ord ord') Source # 
Instance details

Defined in Algebra.Ring.Polynomial.Monomial

SingI Log2Sym0 
Instance details

Defined in Data.Singletons.TypeLits

Methods

sing :: Sing Log2Sym0 #

SingI (<=?@#@$) 
Instance details

Defined in Data.Singletons.TypeLits.Internal

Methods

sing :: Sing (<=?@#@$) #

SingI (^@#@$) 
Instance details

Defined in Data.Singletons.TypeLits.Internal

Methods

sing :: Sing (^@#@$) #

SingI DivSym0 
Instance details

Defined in Data.Singletons.TypeLits

Methods

sing :: Sing DivSym0 #

SingI ModSym0 
Instance details

Defined in Data.Singletons.TypeLits

Methods

sing :: Sing ModSym0 #

SingI EftNatSym0 
Instance details

Defined in Data.Singletons.Prelude.Enum

Methods

sing :: Sing EftNatSym0 #

SingI EfdtNatDnSym0 
Instance details

Defined in Data.Singletons.Prelude.Enum

Methods

sing :: Sing EfdtNatDnSym0 #

SingI EfdtNatSym0 
Instance details

Defined in Data.Singletons.Prelude.Enum

Methods

sing :: Sing EfdtNatSym0 #

SingI EfdtNatUpSym0 
Instance details

Defined in Data.Singletons.Prelude.Enum

Methods

sing :: Sing EfdtNatUpSym0 #

SuppressUnusedWarnings FromEnum_6989586621680204253Sym0 
Instance details

Defined in Data.Singletons.Prelude.Enum

SuppressUnusedWarnings FromEnum_6989586621680204277Sym0 
Instance details

Defined in Data.Singletons.Prelude.Enum

SuppressUnusedWarnings ToEnum_6989586621680204240Sym0 
Instance details

Defined in Data.Singletons.Prelude.Enum

SuppressUnusedWarnings ToEnum_6989586621680204261Sym0 
Instance details

Defined in Data.Singletons.Prelude.Enum

SuppressUnusedWarnings KnownNatSym0 
Instance details

Defined in Data.Singletons.TypeLits

SuppressUnusedWarnings Log2Sym0 
Instance details

Defined in Data.Singletons.TypeLits

SuppressUnusedWarnings FromEnum_6989586621680181073Sym0 
Instance details

Defined in Data.Singletons.Prelude.Enum

SuppressUnusedWarnings Pred_6989586621680181059Sym0 
Instance details

Defined in Data.Singletons.Prelude.Enum

SuppressUnusedWarnings Succ_6989586621680181052Sym0 
Instance details

Defined in Data.Singletons.Prelude.Enum

SuppressUnusedWarnings ToEnum_6989586621680181066Sym0 
Instance details

Defined in Data.Singletons.Prelude.Enum

SuppressUnusedWarnings ToEnum_6989586621680204284Sym0 
Instance details

Defined in Data.Singletons.Prelude.Enum

SuppressUnusedWarnings ShowsPrec_6989586621680654062Sym0 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings ShowsPrec_6989586621680654084Sym0 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (<=?@#@$) 
Instance details

Defined in Data.Singletons.TypeLits.Internal

SuppressUnusedWarnings EftNatSym0 
Instance details

Defined in Data.Singletons.Prelude.Enum

SuppressUnusedWarnings EnumFromTo_6989586621680181081Sym0 
Instance details

Defined in Data.Singletons.Prelude.Enum

SuppressUnusedWarnings (^@#@$) 
Instance details

Defined in Data.Singletons.TypeLits.Internal

SuppressUnusedWarnings DivSym0 
Instance details

Defined in Data.Singletons.TypeLits

SuppressUnusedWarnings ModSym0 
Instance details

Defined in Data.Singletons.TypeLits

SuppressUnusedWarnings QuotSym0 
Instance details

Defined in Data.Singletons.TypeLits

SuppressUnusedWarnings RemSym0 
Instance details

Defined in Data.Singletons.TypeLits

SuppressUnusedWarnings DivModSym0 
Instance details

Defined in Data.Singletons.TypeLits

SuppressUnusedWarnings QuotRemSym0 
Instance details

Defined in Data.Singletons.TypeLits

SuppressUnusedWarnings EfdtNatDnSym0 
Instance details

Defined in Data.Singletons.Prelude.Enum

SuppressUnusedWarnings EfdtNatSym0 
Instance details

Defined in Data.Singletons.Prelude.Enum

SuppressUnusedWarnings EfdtNatUpSym0 
Instance details

Defined in Data.Singletons.Prelude.Enum

SuppressUnusedWarnings EnumFromThenTo_6989586621680181097Sym0 
Instance details

Defined in Data.Singletons.Prelude.Enum

SuppressUnusedWarnings ShowsNatSym0 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings ShowsPrec_6989586621680636824Sym0 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings ShowsPrec_6989586621680653912Sym0 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings ShowsPrec_6989586621680654112Sym0 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings ShowsPrec_6989586621681187235Sym0 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings ShowsPrec_6989586621681187261Sym0 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings FromEnum_6989586621680204294Sym0 
Instance details

Defined in Data.Singletons.Prelude.Enum

SingI x => SingI ((<=?@#@$$) x :: TyFun Nat Bool -> Type) 
Instance details

Defined in Data.Singletons.TypeLits.Internal

Methods

sing :: Sing ((<=?@#@$$) x) #

SingI x => SingI ((^@#@$$) x :: TyFun Nat Nat -> Type) 
Instance details

Defined in Data.Singletons.TypeLits.Internal

Methods

sing :: Sing ((^@#@$$) x) #

SingI x => SingI (DivSym1 x :: TyFun Nat Nat -> Type) 
Instance details

Defined in Data.Singletons.TypeLits

Methods

sing :: Sing (DivSym1 x) #

SingI x => SingI (ModSym1 x :: TyFun Nat Nat -> Type) 
Instance details

Defined in Data.Singletons.TypeLits

Methods

sing :: Sing (ModSym1 x) #

SingI (ListlengthSym0 :: TyFun [a] Nat -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

Methods

sing :: Sing ListlengthSym0 #

SingI (ListindexSym0 :: TyFun [a] (Nat ~> a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

Methods

sing :: Sing ListindexSym0 #

SingI (LengthSym0 :: TyFun [a] Nat -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing LengthSym0 #

SingI ((!!@#@$) :: TyFun [a] (Nat ~> a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing (!!@#@$) #

SingI d => SingI (EftNatSym1 d :: TyFun Nat [Nat] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Enum

Methods

sing :: Sing (EftNatSym1 d) #

SEnum a => SingI (ToEnumSym0 :: TyFun Nat a -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Enum

Methods

sing :: Sing ToEnumSym0 #

SNum a => SingI (FromIntegerSym0 :: TyFun Nat a -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Num

Methods

sing :: Sing FromIntegerSym0 #

SingI (ListtakeSym0 :: TyFun Nat ([a] ~> [a]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

Methods

sing :: Sing ListtakeSym0 #

SingI (ListsplitAtSym0 :: TyFun Nat ([a] ~> ([a], [a])) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

Methods

sing :: Sing ListsplitAtSym0 #

SingI (ListdropSym0 :: TyFun Nat ([a] ~> [a]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

Methods

sing :: Sing ListdropSym0 #

SingI (TakeSym0 :: TyFun Nat ([a] ~> [a]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing TakeSym0 #

SingI (SplitAtSym0 :: TyFun Nat ([a] ~> ([a], [a])) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing SplitAtSym0 #

SingI (DropSym0 :: TyFun Nat ([a] ~> [a]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing DropSym0 #

SingI d => SingI (EfdtNatDnSym1 d :: TyFun Nat (Nat ~> [Nat]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Enum

Methods

sing :: Sing (EfdtNatDnSym1 d) #

SingI d => SingI (EfdtNatSym1 d :: TyFun Nat (Nat ~> [Nat]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Enum

Methods

sing :: Sing (EfdtNatSym1 d) #

SingI d => SingI (EfdtNatUpSym1 d :: TyFun Nat (Nat ~> [Nat]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Enum

Methods

sing :: Sing (EfdtNatUpSym1 d) #

SingI (ReplicateSym0 :: TyFun Nat (a ~> [a]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing ReplicateSym0 #

SShow a => SingI (ShowsPrecSym0 :: TyFun Nat (a ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

Methods

sing :: Sing ShowsPrecSym0 #

SEq a => SingI (ElemIndicesSym0 :: TyFun a ([a] ~> [Nat]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing ElemIndicesSym0 #

SEq a => SingI (ElemIndexSym0 :: TyFun a ([a] ~> Maybe Nat) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing ElemIndexSym0 #

SEnum a => SingI (FromEnumSym0 :: TyFun a Nat -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Enum

Methods

sing :: Sing FromEnumSym0 #

SingI (FindIndicesSym0 :: TyFun (a ~> Bool) ([a] ~> [Nat]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing FindIndicesSym0 #

SingI (FindIndexSym0 :: TyFun (a ~> Bool) ([a] ~> Maybe Nat) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing FindIndexSym0 #

SuppressUnusedWarnings (ListlengthSym0 :: TyFun [a] Nat -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

SuppressUnusedWarnings (ListindexSym0 :: TyFun [a] (Nat ~> a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

SuppressUnusedWarnings (LengthSym0 :: TyFun [a] Nat -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings ((!!@#@$) :: TyFun [a] (Nat ~> a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (Length_6989586621680823238Sym0 :: TyFun [a] Nat -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings ((<=?@#@$$) a6989586621679910752 :: TyFun Nat Bool -> Type) 
Instance details

Defined in Data.Singletons.TypeLits.Internal

SuppressUnusedWarnings (EftNatSym1 a6989586621680180958 :: TyFun Nat [Nat] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Enum

SuppressUnusedWarnings (EnumFromTo_6989586621680181081Sym1 a6989586621680181090 :: TyFun Nat [Nat] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Enum

SuppressUnusedWarnings ((^@#@$$) a6989586621679910455 :: TyFun Nat Nat -> Type) 
Instance details

Defined in Data.Singletons.TypeLits.Internal

SuppressUnusedWarnings (DivSym1 a6989586621679947651 :: TyFun Nat Nat -> Type) 
Instance details

Defined in Data.Singletons.TypeLits

SuppressUnusedWarnings (ModSym1 a6989586621679947992 :: TyFun Nat Nat -> Type) 
Instance details

Defined in Data.Singletons.TypeLits

SuppressUnusedWarnings (QuotSym1 a6989586621679948468 :: TyFun Nat Nat -> Type) 
Instance details

Defined in Data.Singletons.TypeLits

SuppressUnusedWarnings (RemSym1 a6989586621679948457 :: TyFun Nat Nat -> Type) 
Instance details

Defined in Data.Singletons.TypeLits

SuppressUnusedWarnings (DivModSym1 a6989586621679948486 :: TyFun Nat (Nat, Nat) -> Type) 
Instance details

Defined in Data.Singletons.TypeLits

SuppressUnusedWarnings (QuotRemSym1 a6989586621679948479 :: TyFun Nat (Nat, Nat) -> Type) 
Instance details

Defined in Data.Singletons.TypeLits

SuppressUnusedWarnings (ToEnumSym0 :: TyFun Nat a -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Enum

SuppressUnusedWarnings (FromIntegerSym0 :: TyFun Nat a -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Num

SuppressUnusedWarnings (FromInteger_6989586621679976084Sym0 :: TyFun Nat (Down a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Num

SuppressUnusedWarnings (ToEnum_6989586621681203117Sym0 :: TyFun Nat (Min a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (FromInteger_6989586621681203279Sym0 :: TyFun Nat (Min a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (ToEnum_6989586621681203394Sym0 :: TyFun Nat (Max a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (FromInteger_6989586621681203556Sym0 :: TyFun Nat (Max a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (ToEnum_6989586621681203842Sym0 :: TyFun Nat (First a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (ToEnum_6989586621681204050Sym0 :: TyFun Nat (Last a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (ToEnum_6989586621681204219Sym0 :: TyFun Nat (WrappedMonoid a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (ToEnum_6989586621681012388Sym0 :: TyFun Nat (Identity a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Identity

SuppressUnusedWarnings (FromInteger_6989586621681012485Sym0 :: TyFun Nat (Identity a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Identity

SuppressUnusedWarnings (FromInteger_6989586621680269281Sym0 :: TyFun Nat (Sum a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (FromInteger_6989586621680269410Sym0 :: TyFun Nat (Product a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (ListtakeSym0 :: TyFun Nat ([a] ~> [a]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

SuppressUnusedWarnings (ListsplitAtSym0 :: TyFun Nat ([a] ~> ([a], [a])) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

SuppressUnusedWarnings (ListdropSym0 :: TyFun Nat ([a] ~> [a]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

SuppressUnusedWarnings (TakeSym0 :: TyFun Nat ([a] ~> [a]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (SplitAtSym0 :: TyFun Nat ([a] ~> ([a], [a])) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (DropSym0 :: TyFun Nat ([a] ~> [a]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (ShowsPrec_6989586621680636806Sym0 :: TyFun Nat ([a] ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (ShowsPrec_6989586621680653944Sym0 :: TyFun Nat (Maybe a ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (EfdtNatDnSym1 a6989586621680180866 :: TyFun Nat (Nat ~> [Nat]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Enum

SuppressUnusedWarnings (EfdtNatSym1 a6989586621680180940 :: TyFun Nat (Nat ~> [Nat]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Enum

SuppressUnusedWarnings (EfdtNatUpSym1 a6989586621680180903 :: TyFun Nat (Nat ~> [Nat]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Enum

SuppressUnusedWarnings (EnumFromThenTo_6989586621680181097Sym1 a6989586621680181109 :: TyFun Nat (Nat ~> [Nat]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Enum

SuppressUnusedWarnings (ReplicateSym0 :: TyFun Nat (a ~> [a]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (ShowsPrec_6989586621680636774Sym0 :: TyFun Nat (a ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (ShowsPrecSym0 :: TyFun Nat (a ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (ShowsPrec_6989586621681187348Sym0 :: TyFun Nat (Min a ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (ShowsPrec_6989586621681187377Sym0 :: TyFun Nat (Max a ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (ShowsPrec_6989586621681187406Sym0 :: TyFun Nat (First a ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (ShowsPrec_6989586621681187435Sym0 :: TyFun Nat (Last a ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (ShowsPrec_6989586621681187464Sym0 :: TyFun Nat (WrappedMonoid m ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (ShowsPrec_6989586621681187180Sym0 :: TyFun Nat (Option a ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (ShowsPrec_6989586621681012505Sym0 :: TyFun Nat (Identity a ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Identity

SuppressUnusedWarnings (ShowsPrec_6989586621680698028Sym0 :: TyFun Nat (First a ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

SuppressUnusedWarnings (ShowsPrec_6989586621680698057Sym0 :: TyFun Nat (Last a ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

SuppressUnusedWarnings (ShowsPrec_6989586621681187209Sym0 :: TyFun Nat (Dual a ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (ShowsPrec_6989586621681187290Sym0 :: TyFun Nat (Sum a ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (ShowsPrec_6989586621681187319Sym0 :: TyFun Nat (Product a ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (ShowsPrec_6989586621680654038Sym0 :: TyFun Nat (NonEmpty a ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (ElemIndicesSym0 :: TyFun a ([a] ~> [Nat]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (ElemIndexSym0 :: TyFun a ([a] ~> Maybe Nat) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (FromEnumSym0 :: TyFun a Nat -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Enum

SuppressUnusedWarnings (FromEnum_6989586621681203126Sym0 :: TyFun (Min a) Nat -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (FromEnum_6989586621681203403Sym0 :: TyFun (Max a) Nat -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (FromEnum_6989586621681203851Sym0 :: TyFun (First a) Nat -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (FromEnum_6989586621681204059Sym0 :: TyFun (Last a) Nat -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (FromEnum_6989586621681204228Sym0 :: TyFun (WrappedMonoid a) Nat -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (Length_6989586621681012654Sym0 :: TyFun (Identity a) Nat -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Identity

SuppressUnusedWarnings (FromEnum_6989586621681012395Sym0 :: TyFun (Identity a) Nat -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Identity

SuppressUnusedWarnings (Length_6989586621680823647Sym0 :: TyFun (Dual a) Nat -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (Length_6989586621680823822Sym0 :: TyFun (Sum a) Nat -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (Length_6989586621680823997Sym0 :: TyFun (Product a) Nat -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (FindIndicesSym0 :: TyFun (a ~> Bool) ([a] ~> [Nat]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (FindIndexSym0 :: TyFun (a ~> Bool) ([a] ~> Maybe Nat) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SingI d => SingI (FindIndicesSym1 d :: TyFun [a] [Nat] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing (FindIndicesSym1 d) #

SingI d => SingI (FindIndexSym1 d :: TyFun [a] (Maybe Nat) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing (FindIndexSym1 d) #

(SEq a, SingI d) => SingI (ElemIndicesSym1 d :: TyFun [a] [Nat] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing (ElemIndicesSym1 d) #

(SEq a, SingI d) => SingI (ElemIndexSym1 d :: TyFun [a] (Maybe Nat) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing (ElemIndexSym1 d) #

(SingI d1, SingI d2) => SingI (EfdtNatDnSym2 d1 d2 :: TyFun Nat [Nat] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Enum

Methods

sing :: Sing (EfdtNatDnSym2 d1 d2) #

(SingI d1, SingI d2) => SingI (EfdtNatSym2 d1 d2 :: TyFun Nat [Nat] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Enum

Methods

sing :: Sing (EfdtNatSym2 d1 d2) #

(SingI d1, SingI d2) => SingI (EfdtNatUpSym2 d1 d2 :: TyFun Nat [Nat] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Enum

Methods

sing :: Sing (EfdtNatUpSym2 d1 d2) #

SingI d => SingI (ListindexSym1 d :: TyFun Nat a -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

Methods

sing :: Sing (ListindexSym1 d) #

SingI d => SingI ((!!@#@$$) d :: TyFun Nat a -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing ((!!@#@$$) d) #

SApplicative m => SingI (ReplicateM_Sym0 :: TyFun Nat (m a ~> m ()) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad

Methods

sing :: Sing ReplicateM_Sym0 #

SApplicative m => SingI (ReplicateMSym0 :: TyFun Nat (m a ~> m [a]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad

Methods

sing :: Sing ReplicateMSym0 #

SuppressUnusedWarnings (FindIndicesSym1 a6989586621680379629 :: TyFun [a] [Nat] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (FindIndexSym1 a6989586621680379652 :: TyFun [a] (Maybe Nat) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (ElemIndicesSym1 a6989586621680379661 :: TyFun [a] [Nat] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (ElemIndexSym1 a6989586621680379670 :: TyFun [a] (Maybe Nat) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (Length_6989586621680823420Sym0 :: TyFun (Either a1 a2) Nat -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (EfdtNatDnSym2 a6989586621680180866 a6989586621680180867 :: TyFun Nat [Nat] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Enum

SuppressUnusedWarnings (EfdtNatSym2 a6989586621680180940 a6989586621680180941 :: TyFun Nat [Nat] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Enum

SuppressUnusedWarnings (EfdtNatUpSym2 a6989586621680180903 a6989586621680180904 :: TyFun Nat [Nat] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Enum

SuppressUnusedWarnings (EnumFromThenTo_6989586621680181097Sym2 a6989586621680181109 a6989586621680181110 :: TyFun Nat [Nat] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Enum

SuppressUnusedWarnings (ListindexSym1 a6989586621680765275 :: TyFun Nat a -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

SuppressUnusedWarnings ((!!@#@$$) a6989586621680379294 :: TyFun Nat a -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (ToEnum_6989586621680787264Sym0 :: TyFun Nat (Proxy s) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Proxy

SuppressUnusedWarnings (ShowsPrec_6989586621680653998Sym0 :: TyFun Nat (Either a b ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (ShowsPrec_6989586621680636842Sym0 :: TyFun Nat ((a, b) ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (ReplicateM_Sym0 :: TyFun Nat (m a ~> m ()) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad

SuppressUnusedWarnings (ReplicateMSym0 :: TyFun Nat (m a ~> m [a]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad

SuppressUnusedWarnings (ShowsPrec_6989586621681203710Sym0 :: TyFun Nat (Arg a b ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (ShowsPrec_6989586621680787233Sym0 :: TyFun Nat (Proxy s ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Proxy

SuppressUnusedWarnings (Length_6989586621680823494Sym0 :: TyFun (Proxy a) Nat -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (FromEnum_6989586621680787258Sym0 :: TyFun (Proxy s) Nat -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Proxy

SFoldable t => SingI (LengthSym0 :: TyFun (t a) Nat -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

Methods

sing :: Sing LengthSym0 #

SuppressUnusedWarnings (ToEnum_6989586621681044546Sym0 :: TyFun Nat (Const a b) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Const

SuppressUnusedWarnings (FromInteger_6989586621681044643Sym0 :: TyFun Nat (Const a b) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Const

SuppressUnusedWarnings (ShowsPrec_6989586621680636857Sym0 :: TyFun Nat ((a, b, c) ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (ShowsPrec_6989586621681044663Sym0 :: TyFun Nat (Const a b ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Const

SuppressUnusedWarnings (Let6989586621680379633BuildListSym0 :: TyFun k1 (TyFun k2 (TyFun Nat ([b6989586621680375544] ~> [Nat]) -> Type) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (Length_6989586621680823002Sym0 :: TyFun (t a) Nat -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (LengthSym0 :: TyFun (t a) Nat -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (Let6989586621681501314LoopSym0 :: TyFun k (TyFun (m6989586621681500908 a6989586621681500909) (TyFun Nat (m6989586621681500908 [a6989586621681500909]) -> Type) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad

SuppressUnusedWarnings (Let6989586621681501296LoopSym0 :: TyFun k (TyFun (m6989586621681500906 a) (TyFun Nat (m6989586621681500906 ()) -> Type) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad

SuppressUnusedWarnings (FromEnum_6989586621681044553Sym0 :: TyFun (Const a b) Nat -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Const

SuppressUnusedWarnings (ShowsPrec_6989586621680636873Sym0 :: TyFun Nat ((a, b, c, d) ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (Let6989586621680379633BuildListSym1 p6989586621680379631 :: TyFun k2 (TyFun Nat ([b6989586621680375544] ~> [Nat]) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (Let6989586621681501314LoopSym1 cnt06989586621681501312 :: TyFun (m6989586621681500908 a6989586621681500909) (TyFun Nat (m6989586621681500908 [a6989586621681500909]) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad

SuppressUnusedWarnings (Let6989586621681501296LoopSym1 cnt06989586621681501294 :: TyFun (m6989586621681500906 a) (TyFun Nat (m6989586621681500906 ()) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad

SuppressUnusedWarnings (Let6989586621681501314LoopSym2 cnt06989586621681501312 f6989586621681501313 :: TyFun Nat (m6989586621681500908 [a6989586621681500909]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad

SuppressUnusedWarnings (Let6989586621681501296LoopSym2 cnt06989586621681501294 f6989586621681501295 :: TyFun Nat (m6989586621681500906 ()) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad

SuppressUnusedWarnings (Let6989586621680379633BuildListSym2 p6989586621680379631 xs6989586621680379632 :: TyFun Nat ([b6989586621680375544] ~> [Nat]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (ShowsPrec_6989586621680636890Sym0 :: TyFun Nat ((a, b, c, d, e) ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (Let6989586621680379633BuildListSym3 p6989586621680379631 xs6989586621680379632 a6989586621680379634 :: TyFun [b6989586621680375544] [Nat] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (ShowsPrec_6989586621680636908Sym0 :: TyFun Nat ((a, b, c, d, e, f) ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (ShowsPrec_6989586621680636927Sym0 :: TyFun Nat ((a, b, c, d, e, f, g) ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Demote Nat 
Instance details

Defined in Data.Singletons.TypeLits.Internal

type Sing 
Instance details

Defined in Data.Singletons.TypeLits.Internal

type Sing = SNat
type FromEnum (a :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Enum

type FromEnum (a :: Nat) = Apply FromEnum_6989586621680181073Sym0 a
type ToEnum a 
Instance details

Defined in Data.Singletons.Prelude.Enum

type ToEnum a = Apply ToEnum_6989586621680181066Sym0 a
type Abs (a :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Num

type Abs (a :: Nat) = a
type FromInteger a 
Instance details

Defined in Data.Singletons.Prelude.Num

type FromInteger a = a
type Negate (a :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Num

type Negate (a :: Nat) = Error "Cannot negate a natural number" :: Nat
type Signum (a :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Num

type Signum (a :: Nat) = SignumNat a
type Show_ (arg :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Show_ (arg :: Nat) = Apply (Show__6989586621680636786Sym0 :: TyFun Nat Symbol -> Type) arg
type Pred (a :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Enum

type Pred (a :: Nat) = Apply Pred_6989586621680181059Sym0 a
type Succ (a :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Enum

type Succ (a :: Nat) = Apply Succ_6989586621680181052Sym0 a
type EnumFromTo (a1 :: Nat) (a2 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Enum

type EnumFromTo (a1 :: Nat) (a2 :: Nat) = Apply (Apply EnumFromTo_6989586621680181081Sym0 a1) a2
type (x :: Nat) /= (y :: Nat) 
Instance details

Defined in Data.Singletons.TypeLits.Internal

type (x :: Nat) /= (y :: Nat) = Not (x == y)
type (x :: Nat) == (y :: Nat) 
Instance details

Defined in Data.Singletons.TypeLits.Internal

type (x :: Nat) == (y :: Nat) = DefaultEq x y
type (a :: Nat) * (b :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Num

type (a :: Nat) * (b :: Nat) = a * b
type (a :: Nat) + (b :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Num

type (a :: Nat) + (b :: Nat) = a + b
type (a :: Nat) - (b :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Num

type (a :: Nat) - (b :: Nat) = a - b
type (arg1 :: Nat) < (arg2 :: Nat) 
Instance details

Defined in Data.Singletons.TypeLits.Internal

type (arg1 :: Nat) < (arg2 :: Nat) = Apply (Apply (TFHelper_6989586621679837447Sym0 :: TyFun Nat (Nat ~> Bool) -> Type) arg1) arg2
type (arg1 :: Nat) <= (arg2 :: Nat) 
Instance details

Defined in Data.Singletons.TypeLits.Internal

type (arg1 :: Nat) <= (arg2 :: Nat) = Apply (Apply (TFHelper_6989586621679837463Sym0 :: TyFun Nat (Nat ~> Bool) -> Type) arg1) arg2
type (arg1 :: Nat) > (arg2 :: Nat) 
Instance details

Defined in Data.Singletons.TypeLits.Internal

type (arg1 :: Nat) > (arg2 :: Nat) = Apply (Apply (TFHelper_6989586621679837479Sym0 :: TyFun Nat (Nat ~> Bool) -> Type) arg1) arg2
type (arg1 :: Nat) >= (arg2 :: Nat) 
Instance details

Defined in Data.Singletons.TypeLits.Internal

type (arg1 :: Nat) >= (arg2 :: Nat) = Apply (Apply (TFHelper_6989586621679837495Sym0 :: TyFun Nat (Nat ~> Bool) -> Type) arg1) arg2
type Compare (a :: Nat) (b :: Nat) 
Instance details

Defined in Data.Singletons.TypeLits.Internal

type Compare (a :: Nat) (b :: Nat) = CmpNat a b
type Max (arg1 :: Nat) (arg2 :: Nat) 
Instance details

Defined in Data.Singletons.TypeLits.Internal

type Max (arg1 :: Nat) (arg2 :: Nat) = Apply (Apply (Max_6989586621679837511Sym0 :: TyFun Nat (Nat ~> Nat) -> Type) arg1) arg2
type Min (arg1 :: Nat) (arg2 :: Nat) 
Instance details

Defined in Data.Singletons.TypeLits.Internal

type Min (arg1 :: Nat) (arg2 :: Nat) = Apply (Apply (Min_6989586621679837527Sym0 :: TyFun Nat (Nat ~> Nat) -> Type) arg1) arg2
type ShowList (arg1 :: [Nat]) arg2 
Instance details

Defined in Data.Singletons.Prelude.Show

type ShowList (arg1 :: [Nat]) arg2 = Apply (Apply (ShowList_6989586621680636794Sym0 :: TyFun [Nat] (Symbol ~> Symbol) -> Type) arg1) arg2
type Apply FromEnum_6989586621680204253Sym0 (a6989586621680204257 :: Bool) 
Instance details

Defined in Data.Singletons.Prelude.Enum

type Apply FromEnum_6989586621680204253Sym0 (a6989586621680204257 :: Bool) = FromEnum_6989586621680204253Sym1 a6989586621680204257
type Apply FromEnum_6989586621680204277Sym0 (a6989586621680204281 :: Ordering) 
Instance details

Defined in Data.Singletons.Prelude.Enum

type Apply FromEnum_6989586621680204277Sym0 (a6989586621680204281 :: Ordering) = FromEnum_6989586621680204277Sym1 a6989586621680204281
type Apply ToEnum_6989586621680204240Sym0 (a6989586621680204244 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Enum

type Apply ToEnum_6989586621680204240Sym0 (a6989586621680204244 :: Nat) = ToEnum_6989586621680204240Sym1 a6989586621680204244
type Apply ToEnum_6989586621680204261Sym0 (a6989586621680204265 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Enum

type Apply ToEnum_6989586621680204261Sym0 (a6989586621680204265 :: Nat) = ToEnum_6989586621680204261Sym1 a6989586621680204265
type Apply KnownNatSym0 (a6989586621679946868 :: Nat) 
Instance details

Defined in Data.Singletons.TypeLits

type Apply KnownNatSym0 (a6989586621679946868 :: Nat) = KnownNatSym1 a6989586621679946868
type Apply Log2Sym0 (a6989586621679947438 :: Nat) 
Instance details

Defined in Data.Singletons.TypeLits

type Apply Log2Sym0 (a6989586621679947438 :: Nat) = Log2Sym1 a6989586621679947438
type Apply FromEnum_6989586621680181073Sym0 (a6989586621680181077 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Enum

type Apply FromEnum_6989586621680181073Sym0 (a6989586621680181077 :: Nat) = FromEnum_6989586621680181073Sym1 a6989586621680181077
type Apply Pred_6989586621680181059Sym0 (a6989586621680181063 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Enum

type Apply Pred_6989586621680181059Sym0 (a6989586621680181063 :: Nat) = Pred_6989586621680181059Sym1 a6989586621680181063
type Apply Succ_6989586621680181052Sym0 (a6989586621680181056 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Enum

type Apply Succ_6989586621680181052Sym0 (a6989586621680181056 :: Nat) = Succ_6989586621680181052Sym1 a6989586621680181056
type Apply ToEnum_6989586621680181066Sym0 (a6989586621680181070 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Enum

type Apply ToEnum_6989586621680181066Sym0 (a6989586621680181070 :: Nat) = ToEnum_6989586621680181066Sym1 a6989586621680181070
type Apply ToEnum_6989586621680204284Sym0 (a6989586621680204288 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Enum

type Apply ToEnum_6989586621680204284Sym0 (a6989586621680204288 :: Nat) = ToEnum_6989586621680204284Sym1 a6989586621680204288
type Apply FromEnum_6989586621680204294Sym0 (a6989586621680204298 :: ()) 
Instance details

Defined in Data.Singletons.Prelude.Enum

type Apply FromEnum_6989586621680204294Sym0 (a6989586621680204298 :: ()) = FromEnum_6989586621680204294Sym1 a6989586621680204298
type EnumFromThenTo (a1 :: Nat) (a2 :: Nat) (a3 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Enum

type EnumFromThenTo (a1 :: Nat) (a2 :: Nat) (a3 :: Nat) = Apply (Apply (Apply EnumFromThenTo_6989586621680181097Sym0 a1) a2) a3
type ShowsPrec _1 (n :: Nat) x 
Instance details

Defined in Data.Singletons.Prelude.Show

type ShowsPrec _1 (n :: Nat) x = ShowsNat n x
type Apply ((<=?@#@$$) a6989586621679910752 :: TyFun Nat Bool -> Type) (a6989586621679910753 :: Nat) 
Instance details

Defined in Data.Singletons.TypeLits.Internal

type Apply ((<=?@#@$$) a6989586621679910752 :: TyFun Nat Bool -> Type) (a6989586621679910753 :: Nat) = a6989586621679910752 <=?@#@$$$ a6989586621679910753
type Apply ((^@#@$$) a6989586621679910455 :: TyFun Nat Nat -> Type) (a6989586621679910456 :: Nat) 
Instance details

Defined in Data.Singletons.TypeLits.Internal

type Apply ((^@#@$$) a6989586621679910455 :: TyFun Nat Nat -> Type) (a6989586621679910456 :: Nat) = a6989586621679910455 ^@#@$$$ a6989586621679910456
type Apply (DivSym1 a6989586621679947651 :: TyFun Nat Nat -> Type) (a6989586621679947652 :: Nat) 
Instance details

Defined in Data.Singletons.TypeLits

type Apply (DivSym1 a6989586621679947651 :: TyFun Nat Nat -> Type) (a6989586621679947652 :: Nat) = DivSym2 a6989586621679947651 a6989586621679947652
type Apply (ModSym1 a6989586621679947992 :: TyFun Nat Nat -> Type) (a6989586621679947993 :: Nat) 
Instance details

Defined in Data.Singletons.TypeLits

type Apply (ModSym1 a6989586621679947992 :: TyFun Nat Nat -> Type) (a6989586621679947993 :: Nat) = ModSym2 a6989586621679947992 a6989586621679947993
type Apply (QuotSym1 a6989586621679948468 :: TyFun Nat Nat -> Type) (a6989586621679948469 :: Nat) 
Instance details

Defined in Data.Singletons.TypeLits

type Apply (QuotSym1 a6989586621679948468 :: TyFun Nat Nat -> Type) (a6989586621679948469 :: Nat) = QuotSym2 a6989586621679948468 a6989586621679948469
type Apply (RemSym1 a6989586621679948457 :: TyFun Nat Nat -> Type) (a6989586621679948458 :: Nat) 
Instance details

Defined in Data.Singletons.TypeLits

type Apply (RemSym1 a6989586621679948457 :: TyFun Nat Nat -> Type) (a6989586621679948458 :: Nat) = RemSym2 a6989586621679948457 a6989586621679948458
type Apply (ToEnumSym0 :: TyFun Nat k2 -> Type) (a6989586621680180987 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Enum

type Apply (ToEnumSym0 :: TyFun Nat k2 -> Type) (a6989586621680180987 :: Nat) = ToEnumSym1 a6989586621680180987 :: k2
type Apply (FromIntegerSym0 :: TyFun Nat k2 -> Type) (a6989586621679976010 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Num

type Apply (FromIntegerSym0 :: TyFun Nat k2 -> Type) (a6989586621679976010 :: Nat) = FromIntegerSym1 a6989586621679976010 :: k2
type Apply (FromEnumSym0 :: TyFun a Nat -> Type) (a6989586621680180990 :: a) 
Instance details

Defined in Data.Singletons.Prelude.Enum

type Apply (FromEnumSym0 :: TyFun a Nat -> Type) (a6989586621680180990 :: a) = FromEnumSym1 a6989586621680180990
type Apply (ListindexSym1 a6989586621680765275 :: TyFun Nat a -> Type) (a6989586621680765276 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

type Apply (ListindexSym1 a6989586621680765275 :: TyFun Nat a -> Type) (a6989586621680765276 :: Nat) = ListindexSym2 a6989586621680765275 a6989586621680765276
type Apply ((!!@#@$$) a6989586621680379294 :: TyFun Nat a -> Type) (a6989586621680379295 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply ((!!@#@$$) a6989586621680379294 :: TyFun Nat a -> Type) (a6989586621680379295 :: Nat) = a6989586621680379294 !!@#@$$$ a6989586621680379295
type Apply (EftNatSym1 a6989586621680180958 :: TyFun Nat [Nat] -> Type) (a6989586621680180959 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Enum

type Apply (EftNatSym1 a6989586621680180958 :: TyFun Nat [Nat] -> Type) (a6989586621680180959 :: Nat) = EftNatSym2 a6989586621680180958 a6989586621680180959
type Apply (EnumFromTo_6989586621680181081Sym1 a6989586621680181090 :: TyFun Nat [Nat] -> Type) (a6989586621680181091 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Enum

type Apply (EnumFromTo_6989586621680181081Sym1 a6989586621680181090 :: TyFun Nat [Nat] -> Type) (a6989586621680181091 :: Nat) = EnumFromTo_6989586621680181081Sym2 a6989586621680181090 a6989586621680181091
type Apply (FromInteger_6989586621679976084Sym0 :: TyFun Nat (Down a) -> Type) (a6989586621679976088 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Num

type Apply (FromInteger_6989586621679976084Sym0 :: TyFun Nat (Down a) -> Type) (a6989586621679976088 :: Nat) = FromInteger_6989586621679976084Sym1 a6989586621679976088 :: Down a
type Apply (ToEnum_6989586621681203117Sym0 :: TyFun Nat (Min a) -> Type) (a6989586621681203123 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ToEnum_6989586621681203117Sym0 :: TyFun Nat (Min a) -> Type) (a6989586621681203123 :: Nat) = ToEnum_6989586621681203117Sym1 a6989586621681203123 :: Min a
type Apply (FromInteger_6989586621681203279Sym0 :: TyFun Nat (Min a) -> Type) (a6989586621681203285 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (FromInteger_6989586621681203279Sym0 :: TyFun Nat (Min a) -> Type) (a6989586621681203285 :: Nat) = FromInteger_6989586621681203279Sym1 a6989586621681203285 :: Min a
type Apply (ToEnum_6989586621681203394Sym0 :: TyFun Nat (Max a) -> Type) (a6989586621681203400 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ToEnum_6989586621681203394Sym0 :: TyFun Nat (Max a) -> Type) (a6989586621681203400 :: Nat) = ToEnum_6989586621681203394Sym1 a6989586621681203400 :: Max a
type Apply (FromInteger_6989586621681203556Sym0 :: TyFun Nat (Max a) -> Type) (a6989586621681203562 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (FromInteger_6989586621681203556Sym0 :: TyFun Nat (Max a) -> Type) (a6989586621681203562 :: Nat) = FromInteger_6989586621681203556Sym1 a6989586621681203562 :: Max a
type Apply (ToEnum_6989586621681203842Sym0 :: TyFun Nat (First a) -> Type) (a6989586621681203848 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ToEnum_6989586621681203842Sym0 :: TyFun Nat (First a) -> Type) (a6989586621681203848 :: Nat) = ToEnum_6989586621681203842Sym1 a6989586621681203848 :: First a
type Apply (ToEnum_6989586621681204050Sym0 :: TyFun Nat (Last a) -> Type) (a6989586621681204056 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ToEnum_6989586621681204050Sym0 :: TyFun Nat (Last a) -> Type) (a6989586621681204056 :: Nat) = ToEnum_6989586621681204050Sym1 a6989586621681204056 :: Last a
type Apply (ToEnum_6989586621681204219Sym0 :: TyFun Nat (WrappedMonoid a) -> Type) (a6989586621681204225 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ToEnum_6989586621681204219Sym0 :: TyFun Nat (WrappedMonoid a) -> Type) (a6989586621681204225 :: Nat) = ToEnum_6989586621681204219Sym1 a6989586621681204225 :: WrappedMonoid a
type Apply (ToEnum_6989586621681012388Sym0 :: TyFun Nat (Identity a) -> Type) (a6989586621681012392 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type Apply (ToEnum_6989586621681012388Sym0 :: TyFun Nat (Identity a) -> Type) (a6989586621681012392 :: Nat) = ToEnum_6989586621681012388Sym1 a6989586621681012392 :: Identity a
type Apply (FromInteger_6989586621681012485Sym0 :: TyFun Nat (Identity a) -> Type) (a6989586621681012489 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type Apply (FromInteger_6989586621681012485Sym0 :: TyFun Nat (Identity a) -> Type) (a6989586621681012489 :: Nat) = FromInteger_6989586621681012485Sym1 a6989586621681012489 :: Identity a
type Apply (FromInteger_6989586621680269281Sym0 :: TyFun Nat (Sum a) -> Type) (a6989586621680269285 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (FromInteger_6989586621680269281Sym0 :: TyFun Nat (Sum a) -> Type) (a6989586621680269285 :: Nat) = FromInteger_6989586621680269281Sym1 a6989586621680269285 :: Sum a
type Apply (FromInteger_6989586621680269410Sym0 :: TyFun Nat (Product a) -> Type) (a6989586621680269414 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (FromInteger_6989586621680269410Sym0 :: TyFun Nat (Product a) -> Type) (a6989586621680269414 :: Nat) = FromInteger_6989586621680269410Sym1 a6989586621680269414 :: Product a
type Apply (EfdtNatDnSym2 a6989586621680180866 a6989586621680180867 :: TyFun Nat [Nat] -> Type) (a6989586621680180868 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Enum

type Apply (EfdtNatDnSym2 a6989586621680180866 a6989586621680180867 :: TyFun Nat [Nat] -> Type) (a6989586621680180868 :: Nat) = EfdtNatDnSym3 a6989586621680180866 a6989586621680180867 a6989586621680180868
type Apply (EfdtNatSym2 a6989586621680180940 a6989586621680180941 :: TyFun Nat [Nat] -> Type) (a6989586621680180942 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Enum

type Apply (EfdtNatSym2 a6989586621680180940 a6989586621680180941 :: TyFun Nat [Nat] -> Type) (a6989586621680180942 :: Nat) = EfdtNatSym3 a6989586621680180940 a6989586621680180941 a6989586621680180942
type Apply (EfdtNatUpSym2 a6989586621680180903 a6989586621680180904 :: TyFun Nat [Nat] -> Type) (a6989586621680180905 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Enum

type Apply (EfdtNatUpSym2 a6989586621680180903 a6989586621680180904 :: TyFun Nat [Nat] -> Type) (a6989586621680180905 :: Nat) = EfdtNatUpSym3 a6989586621680180903 a6989586621680180904 a6989586621680180905
type Apply (EnumFromThenTo_6989586621680181097Sym2 a6989586621680181109 a6989586621680181110 :: TyFun Nat [Nat] -> Type) (a6989586621680181111 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Enum

type Apply (EnumFromThenTo_6989586621680181097Sym2 a6989586621680181109 a6989586621680181110 :: TyFun Nat [Nat] -> Type) (a6989586621680181111 :: Nat) = EnumFromThenTo_6989586621680181097Sym3 a6989586621680181109 a6989586621680181110 a6989586621680181111
type Apply (Let6989586621681501296LoopSym2 cnt06989586621681501294 f6989586621681501295 :: TyFun Nat (m6989586621681500906 ()) -> Type) (a6989586621681501297 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Monad

type Apply (Let6989586621681501296LoopSym2 cnt06989586621681501294 f6989586621681501295 :: TyFun Nat (m6989586621681500906 ()) -> Type) (a6989586621681501297 :: Nat) = Let6989586621681501296LoopSym3 cnt06989586621681501294 f6989586621681501295 a6989586621681501297
type Apply (Let6989586621681501314LoopSym2 cnt06989586621681501312 f6989586621681501313 :: TyFun Nat (m6989586621681500908 [a6989586621681500909]) -> Type) (a6989586621681501315 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Monad

type Apply (Let6989586621681501314LoopSym2 cnt06989586621681501312 f6989586621681501313 :: TyFun Nat (m6989586621681500908 [a6989586621681500909]) -> Type) (a6989586621681501315 :: Nat) = Let6989586621681501314LoopSym3 cnt06989586621681501312 f6989586621681501313 a6989586621681501315
type Apply ShowsPrec_6989586621680654062Sym0 (a6989586621680654072 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply ShowsPrec_6989586621680654062Sym0 (a6989586621680654072 :: Nat) = ShowsPrec_6989586621680654062Sym1 a6989586621680654072
type Apply ShowsPrec_6989586621680654084Sym0 (a6989586621680654096 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply ShowsPrec_6989586621680654084Sym0 (a6989586621680654096 :: Nat) = ShowsPrec_6989586621680654084Sym1 a6989586621680654096
type Apply (<=?@#@$) (a6989586621679910752 :: Nat) 
Instance details

Defined in Data.Singletons.TypeLits.Internal

type Apply (<=?@#@$) (a6989586621679910752 :: Nat) = (<=?@#@$$) a6989586621679910752
type Apply EftNatSym0 (a6989586621680180958 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Enum

type Apply EftNatSym0 (a6989586621680180958 :: Nat) = EftNatSym1 a6989586621680180958
type Apply EnumFromTo_6989586621680181081Sym0 (a6989586621680181090 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Enum

type Apply EnumFromTo_6989586621680181081Sym0 (a6989586621680181090 :: Nat) = EnumFromTo_6989586621680181081Sym1 a6989586621680181090
type Apply (^@#@$) (a6989586621679910455 :: Nat) 
Instance details

Defined in Data.Singletons.TypeLits.Internal

type Apply (^@#@$) (a6989586621679910455 :: Nat) = (^@#@$$) a6989586621679910455
type Apply DivSym0 (a6989586621679947651 :: Nat) 
Instance details

Defined in Data.Singletons.TypeLits

type Apply DivSym0 (a6989586621679947651 :: Nat) = DivSym1 a6989586621679947651
type Apply ModSym0 (a6989586621679947992 :: Nat) 
Instance details

Defined in Data.Singletons.TypeLits

type Apply ModSym0 (a6989586621679947992 :: Nat) = ModSym1 a6989586621679947992
type Apply QuotSym0 (a6989586621679948468 :: Nat) 
Instance details

Defined in Data.Singletons.TypeLits

type Apply QuotSym0 (a6989586621679948468 :: Nat) = QuotSym1 a6989586621679948468
type Apply RemSym0 (a6989586621679948457 :: Nat) 
Instance details

Defined in Data.Singletons.TypeLits

type Apply RemSym0 (a6989586621679948457 :: Nat) = RemSym1 a6989586621679948457
type Apply DivModSym0 (a6989586621679948486 :: Nat) 
Instance details

Defined in Data.Singletons.TypeLits

type Apply DivModSym0 (a6989586621679948486 :: Nat) = DivModSym1 a6989586621679948486
type Apply QuotRemSym0 (a6989586621679948479 :: Nat) 
Instance details

Defined in Data.Singletons.TypeLits

type Apply QuotRemSym0 (a6989586621679948479 :: Nat) = QuotRemSym1 a6989586621679948479
type Apply EfdtNatDnSym0 (a6989586621680180866 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Enum

type Apply EfdtNatDnSym0 (a6989586621680180866 :: Nat) = EfdtNatDnSym1 a6989586621680180866
type Apply EfdtNatSym0 (a6989586621680180940 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Enum

type Apply EfdtNatSym0 (a6989586621680180940 :: Nat) = EfdtNatSym1 a6989586621680180940
type Apply EfdtNatUpSym0 (a6989586621680180903 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Enum

type Apply EfdtNatUpSym0 (a6989586621680180903 :: Nat) = EfdtNatUpSym1 a6989586621680180903
type Apply EnumFromThenTo_6989586621680181097Sym0 (a6989586621680181109 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Enum

type Apply EnumFromThenTo_6989586621680181097Sym0 (a6989586621680181109 :: Nat) = EnumFromThenTo_6989586621680181097Sym1 a6989586621680181109
type Apply ShowsNatSym0 (a6989586621680653440 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply ShowsNatSym0 (a6989586621680653440 :: Nat) = ShowsNatSym1 a6989586621680653440
type Apply ShowsPrec_6989586621680636824Sym0 (a6989586621680636834 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply ShowsPrec_6989586621680636824Sym0 (a6989586621680636834 :: Nat) = ShowsPrec_6989586621680636824Sym1 a6989586621680636834
type Apply ShowsPrec_6989586621680653912Sym0 (a6989586621680653920 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply ShowsPrec_6989586621680653912Sym0 (a6989586621680653920 :: Nat) = ShowsPrec_6989586621680653912Sym1 a6989586621680653920
type Apply ShowsPrec_6989586621680654112Sym0 (a6989586621680654120 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply ShowsPrec_6989586621680654112Sym0 (a6989586621680654120 :: Nat) = ShowsPrec_6989586621680654112Sym1 a6989586621680654120
type Apply ShowsPrec_6989586621681187235Sym0 (a6989586621681187243 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply ShowsPrec_6989586621681187235Sym0 (a6989586621681187243 :: Nat) = ShowsPrec_6989586621681187235Sym1 a6989586621681187243
type Apply ShowsPrec_6989586621681187261Sym0 (a6989586621681187269 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply ShowsPrec_6989586621681187261Sym0 (a6989586621681187269 :: Nat) = ShowsPrec_6989586621681187261Sym1 a6989586621681187269
type Apply (DivModSym1 a6989586621679948486 :: TyFun Nat (Nat, Nat) -> Type) (a6989586621679948487 :: Nat) 
Instance details

Defined in Data.Singletons.TypeLits

type Apply (DivModSym1 a6989586621679948486 :: TyFun Nat (Nat, Nat) -> Type) (a6989586621679948487 :: Nat) = DivModSym2 a6989586621679948486 a6989586621679948487
type Apply (QuotRemSym1 a6989586621679948479 :: TyFun Nat (Nat, Nat) -> Type) (a6989586621679948480 :: Nat) 
Instance details

Defined in Data.Singletons.TypeLits

type Apply (QuotRemSym1 a6989586621679948479 :: TyFun Nat (Nat, Nat) -> Type) (a6989586621679948480 :: Nat) = QuotRemSym2 a6989586621679948479 a6989586621679948480
type Apply (ListsplitAtSym0 :: TyFun Nat ([a] ~> ([a], [a])) -> Type) (a6989586621680765286 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

type Apply (ListsplitAtSym0 :: TyFun Nat ([a] ~> ([a], [a])) -> Type) (a6989586621680765286 :: Nat) = ListsplitAtSym1 a6989586621680765286 :: TyFun [a] ([a], [a]) -> Type
type Apply (ListdropSym0 :: TyFun Nat ([a] ~> [a]) -> Type) (a6989586621680765297 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

type Apply (ListdropSym0 :: TyFun Nat ([a] ~> [a]) -> Type) (a6989586621680765297 :: Nat) = ListdropSym1 a6989586621680765297 :: TyFun [a] [a] -> Type
type Apply (ListtakeSym0 :: TyFun Nat ([a] ~> [a]) -> Type) (a6989586621680765308 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

type Apply (ListtakeSym0 :: TyFun Nat ([a] ~> [a]) -> Type) (a6989586621680765308 :: Nat) = ListtakeSym1 a6989586621680765308 :: TyFun [a] [a] -> Type
type Apply (DropSym0 :: TyFun Nat ([a] ~> [a]) -> Type) (a6989586621680379456 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (DropSym0 :: TyFun Nat ([a] ~> [a]) -> Type) (a6989586621680379456 :: Nat) = DropSym1 a6989586621680379456 :: TyFun [a] [a] -> Type
type Apply (TakeSym0 :: TyFun Nat ([a] ~> [a]) -> Type) (a6989586621680379469 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (TakeSym0 :: TyFun Nat ([a] ~> [a]) -> Type) (a6989586621680379469 :: Nat) = TakeSym1 a6989586621680379469 :: TyFun [a] [a] -> Type
type Apply (SplitAtSym0 :: TyFun Nat ([a] ~> ([a], [a])) -> Type) (a6989586621680379449 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (SplitAtSym0 :: TyFun Nat ([a] ~> ([a], [a])) -> Type) (a6989586621680379449 :: Nat) = SplitAtSym1 a6989586621680379449 :: TyFun [a] ([a], [a]) -> Type
type Apply (ShowsPrec_6989586621680636806Sym0 :: TyFun Nat ([a] ~> (Symbol ~> Symbol)) -> Type) (a6989586621680636816 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680636806Sym0 :: TyFun Nat ([a] ~> (Symbol ~> Symbol)) -> Type) (a6989586621680636816 :: Nat) = ShowsPrec_6989586621680636806Sym1 a6989586621680636816 :: TyFun [a] (Symbol ~> Symbol) -> Type
type Apply (ShowsPrec_6989586621680653944Sym0 :: TyFun Nat (Maybe a ~> (Symbol ~> Symbol)) -> Type) (a6989586621680653954 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680653944Sym0 :: TyFun Nat (Maybe a ~> (Symbol ~> Symbol)) -> Type) (a6989586621680653954 :: Nat) = ShowsPrec_6989586621680653944Sym1 a6989586621680653954 :: TyFun (Maybe a) (Symbol ~> Symbol) -> Type
type Apply (EfdtNatDnSym1 a6989586621680180866 :: TyFun Nat (Nat ~> [Nat]) -> Type) (a6989586621680180867 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Enum

type Apply (EfdtNatDnSym1 a6989586621680180866 :: TyFun Nat (Nat ~> [Nat]) -> Type) (a6989586621680180867 :: Nat) = EfdtNatDnSym2 a6989586621680180866 a6989586621680180867
type Apply (EfdtNatSym1 a6989586621680180940 :: TyFun Nat (Nat ~> [Nat]) -> Type) (a6989586621680180941 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Enum

type Apply (EfdtNatSym1 a6989586621680180940 :: TyFun Nat (Nat ~> [Nat]) -> Type) (a6989586621680180941 :: Nat) = EfdtNatSym2 a6989586621680180940 a6989586621680180941
type Apply (EfdtNatUpSym1 a6989586621680180903 :: TyFun Nat (Nat ~> [Nat]) -> Type) (a6989586621680180904 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Enum

type Apply (EfdtNatUpSym1 a6989586621680180903 :: TyFun Nat (Nat ~> [Nat]) -> Type) (a6989586621680180904 :: Nat) = EfdtNatUpSym2 a6989586621680180903 a6989586621680180904
type Apply (EnumFromThenTo_6989586621680181097Sym1 a6989586621680181109 :: TyFun Nat (Nat ~> [Nat]) -> Type) (a6989586621680181110 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Enum

type Apply (EnumFromThenTo_6989586621680181097Sym1 a6989586621680181109 :: TyFun Nat (Nat ~> [Nat]) -> Type) (a6989586621680181110 :: Nat) = EnumFromThenTo_6989586621680181097Sym2 a6989586621680181109 a6989586621680181110
type Apply (ReplicateSym0 :: TyFun Nat (a ~> [a]) -> Type) (a6989586621680379314 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (ReplicateSym0 :: TyFun Nat (a ~> [a]) -> Type) (a6989586621680379314 :: Nat) = ReplicateSym1 a6989586621680379314 :: TyFun a [a] -> Type
type Apply (ShowsPrec_6989586621680636774Sym0 :: TyFun Nat (a ~> (Symbol ~> Symbol)) -> Type) (a6989586621680636780 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680636774Sym0 :: TyFun Nat (a ~> (Symbol ~> Symbol)) -> Type) (a6989586621680636780 :: Nat) = ShowsPrec_6989586621680636774Sym1 a6989586621680636780 :: TyFun a (Symbol ~> Symbol) -> Type
type Apply (ShowsPrecSym0 :: TyFun Nat (a ~> (Symbol ~> Symbol)) -> Type) (a6989586621680636760 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrecSym0 :: TyFun Nat (a ~> (Symbol ~> Symbol)) -> Type) (a6989586621680636760 :: Nat) = ShowsPrecSym1 a6989586621680636760 :: TyFun a (Symbol ~> Symbol) -> Type
type Apply (ShowsPrec_6989586621681187348Sym0 :: TyFun Nat (Min a ~> (Symbol ~> Symbol)) -> Type) (a6989586621681187356 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ShowsPrec_6989586621681187348Sym0 :: TyFun Nat (Min a ~> (Symbol ~> Symbol)) -> Type) (a6989586621681187356 :: Nat) = ShowsPrec_6989586621681187348Sym1 a6989586621681187356 :: TyFun (Min a) (Symbol ~> Symbol) -> Type
type Apply (ShowsPrec_6989586621681187377Sym0 :: TyFun Nat (Max a ~> (Symbol ~> Symbol)) -> Type) (a6989586621681187385 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ShowsPrec_6989586621681187377Sym0 :: TyFun Nat (Max a ~> (Symbol ~> Symbol)) -> Type) (a6989586621681187385 :: Nat) = ShowsPrec_6989586621681187377Sym1 a6989586621681187385 :: TyFun (Max a) (Symbol ~> Symbol) -> Type
type Apply (ShowsPrec_6989586621681187406Sym0 :: TyFun Nat (First a ~> (Symbol ~> Symbol)) -> Type) (a6989586621681187414 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ShowsPrec_6989586621681187406Sym0 :: TyFun Nat (First a ~> (Symbol ~> Symbol)) -> Type) (a6989586621681187414 :: Nat) = ShowsPrec_6989586621681187406Sym1 a6989586621681187414 :: TyFun (First a) (Symbol ~> Symbol) -> Type
type Apply (ShowsPrec_6989586621681187435Sym0 :: TyFun Nat (Last a ~> (Symbol ~> Symbol)) -> Type) (a6989586621681187443 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ShowsPrec_6989586621681187435Sym0 :: TyFun Nat (Last a ~> (Symbol ~> Symbol)) -> Type) (a6989586621681187443 :: Nat) = ShowsPrec_6989586621681187435Sym1 a6989586621681187443 :: TyFun (Last a) (Symbol ~> Symbol) -> Type
type Apply (ShowsPrec_6989586621681187464Sym0 :: TyFun Nat (WrappedMonoid m ~> (Symbol ~> Symbol)) -> Type) (a6989586621681187472 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ShowsPrec_6989586621681187464Sym0 :: TyFun Nat (WrappedMonoid m ~> (Symbol ~> Symbol)) -> Type) (a6989586621681187472 :: Nat) = ShowsPrec_6989586621681187464Sym1 a6989586621681187472 :: TyFun (WrappedMonoid m) (Symbol ~> Symbol) -> Type
type Apply (ShowsPrec_6989586621681187180Sym0 :: TyFun Nat (Option a ~> (Symbol ~> Symbol)) -> Type) (a6989586621681187188 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ShowsPrec_6989586621681187180Sym0 :: TyFun Nat (Option a ~> (Symbol ~> Symbol)) -> Type) (a6989586621681187188 :: Nat) = ShowsPrec_6989586621681187180Sym1 a6989586621681187188 :: TyFun (Option a) (Symbol ~> Symbol) -> Type
type Apply (ShowsPrec_6989586621681012505Sym0 :: TyFun Nat (Identity a ~> (Symbol ~> Symbol)) -> Type) (a6989586621681012513 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type Apply (ShowsPrec_6989586621681012505Sym0 :: TyFun Nat (Identity a ~> (Symbol ~> Symbol)) -> Type) (a6989586621681012513 :: Nat) = ShowsPrec_6989586621681012505Sym1 a6989586621681012513 :: TyFun (Identity a) (Symbol ~> Symbol) -> Type
type Apply (ShowsPrec_6989586621680698028Sym0 :: TyFun Nat (First a ~> (Symbol ~> Symbol)) -> Type) (a6989586621680698036 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (ShowsPrec_6989586621680698028Sym0 :: TyFun Nat (First a ~> (Symbol ~> Symbol)) -> Type) (a6989586621680698036 :: Nat) = ShowsPrec_6989586621680698028Sym1 a6989586621680698036 :: TyFun (First a) (Symbol ~> Symbol) -> Type
type Apply (ShowsPrec_6989586621680698057Sym0 :: TyFun Nat (Last a ~> (Symbol ~> Symbol)) -> Type) (a6989586621680698065 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (ShowsPrec_6989586621680698057Sym0 :: TyFun Nat (Last a ~> (Symbol ~> Symbol)) -> Type) (a6989586621680698065 :: Nat) = ShowsPrec_6989586621680698057Sym1 a6989586621680698065 :: TyFun (Last a) (Symbol ~> Symbol) -> Type
type Apply (ShowsPrec_6989586621681187209Sym0 :: TyFun Nat (Dual a ~> (Symbol ~> Symbol)) -> Type) (a6989586621681187217 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ShowsPrec_6989586621681187209Sym0 :: TyFun Nat (Dual a ~> (Symbol ~> Symbol)) -> Type) (a6989586621681187217 :: Nat) = ShowsPrec_6989586621681187209Sym1 a6989586621681187217 :: TyFun (Dual a) (Symbol ~> Symbol) -> Type
type Apply (ShowsPrec_6989586621681187290Sym0 :: TyFun Nat (Sum a ~> (Symbol ~> Symbol)) -> Type) (a6989586621681187298 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ShowsPrec_6989586621681187290Sym0 :: TyFun Nat (Sum a ~> (Symbol ~> Symbol)) -> Type) (a6989586621681187298 :: Nat) = ShowsPrec_6989586621681187290Sym1 a6989586621681187298 :: TyFun (Sum a) (Symbol ~> Symbol) -> Type
type Apply (ShowsPrec_6989586621681187319Sym0 :: TyFun Nat (Product a ~> (Symbol ~> Symbol)) -> Type) (a6989586621681187327 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ShowsPrec_6989586621681187319Sym0 :: TyFun Nat (Product a ~> (Symbol ~> Symbol)) -> Type) (a6989586621681187327 :: Nat) = ShowsPrec_6989586621681187319Sym1 a6989586621681187327 :: TyFun (Product a) (Symbol ~> Symbol) -> Type
type Apply (ShowsPrec_6989586621680654038Sym0 :: TyFun Nat (NonEmpty a ~> (Symbol ~> Symbol)) -> Type) (a6989586621680654046 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680654038Sym0 :: TyFun Nat (NonEmpty a ~> (Symbol ~> Symbol)) -> Type) (a6989586621680654046 :: Nat) = ShowsPrec_6989586621680654038Sym1 a6989586621680654046 :: TyFun (NonEmpty a) (Symbol ~> Symbol) -> Type
type Apply (ElemIndicesSym0 :: TyFun a ([a] ~> [Nat]) -> Type) (a6989586621680379661 :: a) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (ElemIndicesSym0 :: TyFun a ([a] ~> [Nat]) -> Type) (a6989586621680379661 :: a) = ElemIndicesSym1 a6989586621680379661
type Apply (ElemIndexSym0 :: TyFun a ([a] ~> Maybe Nat) -> Type) (a6989586621680379670 :: a) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (ElemIndexSym0 :: TyFun a ([a] ~> Maybe Nat) -> Type) (a6989586621680379670 :: a) = ElemIndexSym1 a6989586621680379670
type Apply (ToEnum_6989586621680787264Sym0 :: TyFun Nat (Proxy s) -> Type) (a6989586621680787268 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Proxy

type Apply (ToEnum_6989586621680787264Sym0 :: TyFun Nat (Proxy s) -> Type) (a6989586621680787268 :: Nat) = ToEnum_6989586621680787264Sym1 a6989586621680787268 :: Proxy s
type Apply (ShowsPrec_6989586621680653998Sym0 :: TyFun Nat (Either a b ~> (Symbol ~> Symbol)) -> Type) (a6989586621680654008 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680653998Sym0 :: TyFun Nat (Either a b ~> (Symbol ~> Symbol)) -> Type) (a6989586621680654008 :: Nat) = ShowsPrec_6989586621680653998Sym1 a6989586621680654008 :: TyFun (Either a b) (Symbol ~> Symbol) -> Type
type Apply (ShowsPrec_6989586621680636842Sym0 :: TyFun Nat ((a, b) ~> (Symbol ~> Symbol)) -> Type) (a6989586621680636848 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680636842Sym0 :: TyFun Nat ((a, b) ~> (Symbol ~> Symbol)) -> Type) (a6989586621680636848 :: Nat) = ShowsPrec_6989586621680636842Sym1 a6989586621680636848 :: TyFun (a, b) (Symbol ~> Symbol) -> Type
type Apply (ReplicateM_Sym0 :: TyFun Nat (m a ~> m ()) -> Type) (a6989586621681501292 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Monad

type Apply (ReplicateM_Sym0 :: TyFun Nat (m a ~> m ()) -> Type) (a6989586621681501292 :: Nat) = ReplicateM_Sym1 a6989586621681501292 :: TyFun (m a) (m ()) -> Type
type Apply (ReplicateMSym0 :: TyFun Nat (m a ~> m [a]) -> Type) (a6989586621681501310 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Monad

type Apply (ReplicateMSym0 :: TyFun Nat (m a ~> m [a]) -> Type) (a6989586621681501310 :: Nat) = ReplicateMSym1 a6989586621681501310 :: TyFun (m a) (m [a]) -> Type
type Apply (ShowsPrec_6989586621681203710Sym0 :: TyFun Nat (Arg a b ~> (Symbol ~> Symbol)) -> Type) (a6989586621681203718 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ShowsPrec_6989586621681203710Sym0 :: TyFun Nat (Arg a b ~> (Symbol ~> Symbol)) -> Type) (a6989586621681203718 :: Nat) = ShowsPrec_6989586621681203710Sym1 a6989586621681203718 :: TyFun (Arg a b) (Symbol ~> Symbol) -> Type
type Apply (ShowsPrec_6989586621680787233Sym0 :: TyFun Nat (Proxy s ~> (Symbol ~> Symbol)) -> Type) (a6989586621680787241 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Proxy

type Apply (ShowsPrec_6989586621680787233Sym0 :: TyFun Nat (Proxy s ~> (Symbol ~> Symbol)) -> Type) (a6989586621680787241 :: Nat) = ShowsPrec_6989586621680787233Sym1 a6989586621680787241 :: TyFun (Proxy s) (Symbol ~> Symbol) -> Type
type Apply (ShowsPrec_6989586621680636857Sym0 :: TyFun Nat ((a, b, c) ~> (Symbol ~> Symbol)) -> Type) (a6989586621680636863 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680636857Sym0 :: TyFun Nat ((a, b, c) ~> (Symbol ~> Symbol)) -> Type) (a6989586621680636863 :: Nat) = ShowsPrec_6989586621680636857Sym1 a6989586621680636863 :: TyFun (a, b, c) (Symbol ~> Symbol) -> Type
type Apply (ShowsPrec_6989586621681044663Sym0 :: TyFun Nat (Const a b ~> (Symbol ~> Symbol)) -> Type) (a6989586621681044671 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Const

type Apply (ShowsPrec_6989586621681044663Sym0 :: TyFun Nat (Const a b ~> (Symbol ~> Symbol)) -> Type) (a6989586621681044671 :: Nat) = ShowsPrec_6989586621681044663Sym1 a6989586621681044671 :: TyFun (Const a b) (Symbol ~> Symbol) -> Type
type Apply (Let6989586621680379633BuildListSym0 :: TyFun k1 (TyFun k2 (TyFun Nat ([b6989586621680375544] ~> [Nat]) -> Type) -> Type) -> Type) (p6989586621680379631 :: k1) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (Let6989586621680379633BuildListSym0 :: TyFun k1 (TyFun k2 (TyFun Nat ([b6989586621680375544] ~> [Nat]) -> Type) -> Type) -> Type) (p6989586621680379631 :: k1) = Let6989586621680379633BuildListSym1 p6989586621680379631 :: TyFun k2 (TyFun Nat ([b6989586621680375544] ~> [Nat]) -> Type) -> Type
type Apply (Let6989586621681501296LoopSym0 :: TyFun k (TyFun (m6989586621681500906 a) (TyFun Nat (m6989586621681500906 ()) -> Type) -> Type) -> Type) (cnt06989586621681501294 :: k) 
Instance details

Defined in Data.Singletons.Prelude.Monad

type Apply (Let6989586621681501296LoopSym0 :: TyFun k (TyFun (m6989586621681500906 a) (TyFun Nat (m6989586621681500906 ()) -> Type) -> Type) -> Type) (cnt06989586621681501294 :: k) = Let6989586621681501296LoopSym1 cnt06989586621681501294 :: TyFun (m6989586621681500906 a) (TyFun Nat (m6989586621681500906 ()) -> Type) -> Type
type Apply (Let6989586621681501314LoopSym0 :: TyFun k (TyFun (m6989586621681500908 a6989586621681500909) (TyFun Nat (m6989586621681500908 [a6989586621681500909]) -> Type) -> Type) -> Type) (cnt06989586621681501312 :: k) 
Instance details

Defined in Data.Singletons.Prelude.Monad

type Apply (Let6989586621681501314LoopSym0 :: TyFun k (TyFun (m6989586621681500908 a6989586621681500909) (TyFun Nat (m6989586621681500908 [a6989586621681500909]) -> Type) -> Type) -> Type) (cnt06989586621681501312 :: k) = Let6989586621681501314LoopSym1 cnt06989586621681501312 :: TyFun (m6989586621681500908 a6989586621681500909) (TyFun Nat (m6989586621681500908 [a6989586621681500909]) -> Type) -> Type
type Apply (ShowsPrec_6989586621680636873Sym0 :: TyFun Nat ((a, b, c, d) ~> (Symbol ~> Symbol)) -> Type) (a6989586621680636879 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680636873Sym0 :: TyFun Nat ((a, b, c, d) ~> (Symbol ~> Symbol)) -> Type) (a6989586621680636879 :: Nat) = ShowsPrec_6989586621680636873Sym1 a6989586621680636879 :: TyFun (a, b, c, d) (Symbol ~> Symbol) -> Type
type Apply (Let6989586621680379633BuildListSym1 p6989586621680379631 :: TyFun k2 (TyFun Nat ([b6989586621680375544] ~> [Nat]) -> Type) -> Type) (xs6989586621680379632 :: k2) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (Let6989586621680379633BuildListSym1 p6989586621680379631 :: TyFun k2 (TyFun Nat ([b6989586621680375544] ~> [Nat]) -> Type) -> Type) (xs6989586621680379632 :: k2) = Let6989586621680379633BuildListSym2 p6989586621680379631 xs6989586621680379632 :: TyFun Nat ([b6989586621680375544] ~> [Nat]) -> Type
type Apply (Let6989586621680379633BuildListSym2 p6989586621680379631 xs6989586621680379632 :: TyFun Nat ([b6989586621680375544] ~> [Nat]) -> Type) (a6989586621680379634 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (Let6989586621680379633BuildListSym2 p6989586621680379631 xs6989586621680379632 :: TyFun Nat ([b6989586621680375544] ~> [Nat]) -> Type) (a6989586621680379634 :: Nat) = Let6989586621680379633BuildListSym3 p6989586621680379631 xs6989586621680379632 a6989586621680379634 :: TyFun [b6989586621680375544] [Nat] -> Type
type Apply (ShowsPrec_6989586621680636890Sym0 :: TyFun Nat ((a, b, c, d, e) ~> (Symbol ~> Symbol)) -> Type) (a6989586621680636896 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680636890Sym0 :: TyFun Nat ((a, b, c, d, e) ~> (Symbol ~> Symbol)) -> Type) (a6989586621680636896 :: Nat) = ShowsPrec_6989586621680636890Sym1 a6989586621680636896 :: TyFun (a, b, c, d, e) (Symbol ~> Symbol) -> Type
type Apply (ShowsPrec_6989586621680636908Sym0 :: TyFun Nat ((a, b, c, d, e, f) ~> (Symbol ~> Symbol)) -> Type) (a6989586621680636914 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680636908Sym0 :: TyFun Nat ((a, b, c, d, e, f) ~> (Symbol ~> Symbol)) -> Type) (a6989586621680636914 :: Nat) = ShowsPrec_6989586621680636908Sym1 a6989586621680636914 :: TyFun (a, b, c, d, e, f) (Symbol ~> Symbol) -> Type
type Apply (ShowsPrec_6989586621680636927Sym0 :: TyFun Nat ((a, b, c, d, e, f, g) ~> (Symbol ~> Symbol)) -> Type) (a6989586621680636933 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680636927Sym0 :: TyFun Nat ((a, b, c, d, e, f, g) ~> (Symbol ~> Symbol)) -> Type) (a6989586621680636933 :: Nat) = ShowsPrec_6989586621680636927Sym1 a6989586621680636933 :: TyFun (a, b, c, d, e, f, g) (Symbol ~> Symbol) -> Type
type Apply (ToEnum_6989586621681044546Sym0 :: TyFun Nat (Const a b) -> Type) (a6989586621681044550 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Const

type Apply (ToEnum_6989586621681044546Sym0 :: TyFun Nat (Const a b) -> Type) (a6989586621681044550 :: Nat) = ToEnum_6989586621681044546Sym1 a6989586621681044550 :: Const a b
type Apply (FromInteger_6989586621681044643Sym0 :: TyFun Nat (Const a b) -> Type) (a6989586621681044647 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Const

type Apply (FromInteger_6989586621681044643Sym0 :: TyFun Nat (Const a b) -> Type) (a6989586621681044647 :: Nat) = FromInteger_6989586621681044643Sym1 a6989586621681044647 :: Const a b
type Apply (Length_6989586621680823238Sym0 :: TyFun [a] Nat -> Type) (a6989586621680823244 :: [a]) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Length_6989586621680823238Sym0 :: TyFun [a] Nat -> Type) (a6989586621680823244 :: [a]) = Length_6989586621680823238Sym1 a6989586621680823244
type Apply (ListlengthSym0 :: TyFun [a] Nat -> Type) (a6989586621680765266 :: [a]) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

type Apply (ListlengthSym0 :: TyFun [a] Nat -> Type) (a6989586621680765266 :: [a]) = ListlengthSym1 a6989586621680765266
type Apply (LengthSym0 :: TyFun [a] Nat -> Type) (a6989586621680379325 :: [a]) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (LengthSym0 :: TyFun [a] Nat -> Type) (a6989586621680379325 :: [a]) = LengthSym1 a6989586621680379325
type Apply (FromEnum_6989586621681203126Sym0 :: TyFun (Min a) Nat -> Type) (a6989586621681203130 :: Min a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (FromEnum_6989586621681203126Sym0 :: TyFun (Min a) Nat -> Type) (a6989586621681203130 :: Min a) = FromEnum_6989586621681203126Sym1 a6989586621681203130
type Apply (FromEnum_6989586621681203403Sym0 :: TyFun (Max a) Nat -> Type) (a6989586621681203407 :: Max a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (FromEnum_6989586621681203403Sym0 :: TyFun (Max a) Nat -> Type) (a6989586621681203407 :: Max a) = FromEnum_6989586621681203403Sym1 a6989586621681203407
type Apply (FromEnum_6989586621681203851Sym0 :: TyFun (First a) Nat -> Type) (a6989586621681203855 :: First a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (FromEnum_6989586621681203851Sym0 :: TyFun (First a) Nat -> Type) (a6989586621681203855 :: First a) = FromEnum_6989586621681203851Sym1 a6989586621681203855
type Apply (FromEnum_6989586621681204059Sym0 :: TyFun (Last a) Nat -> Type) (a6989586621681204063 :: Last a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (FromEnum_6989586621681204059Sym0 :: TyFun (Last a) Nat -> Type) (a6989586621681204063 :: Last a) = FromEnum_6989586621681204059Sym1 a6989586621681204063
type Apply (FromEnum_6989586621681204228Sym0 :: TyFun (WrappedMonoid a) Nat -> Type) (a6989586621681204232 :: WrappedMonoid a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (FromEnum_6989586621681204228Sym0 :: TyFun (WrappedMonoid a) Nat -> Type) (a6989586621681204232 :: WrappedMonoid a) = FromEnum_6989586621681204228Sym1 a6989586621681204232
type Apply (FromEnum_6989586621681012395Sym0 :: TyFun (Identity a) Nat -> Type) (a6989586621681012399 :: Identity a) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type Apply (FromEnum_6989586621681012395Sym0 :: TyFun (Identity a) Nat -> Type) (a6989586621681012399 :: Identity a) = FromEnum_6989586621681012395Sym1 a6989586621681012399
type Apply (Length_6989586621681012654Sym0 :: TyFun (Identity a) Nat -> Type) (a6989586621681012658 :: Identity a) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type Apply (Length_6989586621681012654Sym0 :: TyFun (Identity a) Nat -> Type) (a6989586621681012658 :: Identity a) = Length_6989586621681012654Sym1 a6989586621681012658
type Apply (Length_6989586621680823647Sym0 :: TyFun (Dual a) Nat -> Type) (a6989586621680823651 :: Dual a) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Length_6989586621680823647Sym0 :: TyFun (Dual a) Nat -> Type) (a6989586621680823651 :: Dual a) = Length_6989586621680823647Sym1 a6989586621680823651
type Apply (Length_6989586621680823822Sym0 :: TyFun (Sum a) Nat -> Type) (a6989586621680823826 :: Sum a) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Length_6989586621680823822Sym0 :: TyFun (Sum a) Nat -> Type) (a6989586621680823826 :: Sum a) = Length_6989586621680823822Sym1 a6989586621680823826
type Apply (Length_6989586621680823997Sym0 :: TyFun (Product a) Nat -> Type) (a6989586621680824001 :: Product a) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Length_6989586621680823997Sym0 :: TyFun (Product a) Nat -> Type) (a6989586621680824001 :: Product a) = Length_6989586621680823997Sym1 a6989586621680824001
type Apply (Length_6989586621680823002Sym0 :: TyFun (t a) Nat -> Type) (a6989586621680823008 :: t a) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Length_6989586621680823002Sym0 :: TyFun (t a) Nat -> Type) (a6989586621680823008 :: t a) = Length_6989586621680823002Sym1 a6989586621680823008
type Apply (LengthSym0 :: TyFun (t a) Nat -> Type) (a6989586621680822817 :: t a) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (LengthSym0 :: TyFun (t a) Nat -> Type) (a6989586621680822817 :: t a) = LengthSym1 a6989586621680822817
type Apply (FindIndicesSym1 a6989586621680379629 :: TyFun [a] [Nat] -> Type) (a6989586621680379630 :: [a]) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (FindIndicesSym1 a6989586621680379629 :: TyFun [a] [Nat] -> Type) (a6989586621680379630 :: [a]) = FindIndicesSym2 a6989586621680379629 a6989586621680379630
type Apply (ElemIndicesSym1 a6989586621680379661 :: TyFun [a] [Nat] -> Type) (a6989586621680379662 :: [a]) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (ElemIndicesSym1 a6989586621680379661 :: TyFun [a] [Nat] -> Type) (a6989586621680379662 :: [a]) = ElemIndicesSym2 a6989586621680379661 a6989586621680379662
type Apply (FindIndexSym1 a6989586621680379652 :: TyFun [a] (Maybe Nat) -> Type) (a6989586621680379653 :: [a]) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (FindIndexSym1 a6989586621680379652 :: TyFun [a] (Maybe Nat) -> Type) (a6989586621680379653 :: [a]) = FindIndexSym2 a6989586621680379652 a6989586621680379653
type Apply (ElemIndexSym1 a6989586621680379670 :: TyFun [a] (Maybe Nat) -> Type) (a6989586621680379671 :: [a]) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (ElemIndexSym1 a6989586621680379670 :: TyFun [a] (Maybe Nat) -> Type) (a6989586621680379671 :: [a]) = ElemIndexSym2 a6989586621680379670 a6989586621680379671
type Apply (Let6989586621680379633BuildListSym3 p6989586621680379631 xs6989586621680379632 a6989586621680379634 :: TyFun [b6989586621680375544] [Nat] -> Type) (a6989586621680379635 :: [b6989586621680375544]) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (Let6989586621680379633BuildListSym3 p6989586621680379631 xs6989586621680379632 a6989586621680379634 :: TyFun [b6989586621680375544] [Nat] -> Type) (a6989586621680379635 :: [b6989586621680375544]) = Let6989586621680379633BuildListSym4 p6989586621680379631 xs6989586621680379632 a6989586621680379634 a6989586621680379635
type Apply (ListindexSym0 :: TyFun [a] (Nat ~> a) -> Type) (a6989586621680765275 :: [a]) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

type Apply (ListindexSym0 :: TyFun [a] (Nat ~> a) -> Type) (a6989586621680765275 :: [a]) = ListindexSym1 a6989586621680765275
type Apply ((!!@#@$) :: TyFun [a] (Nat ~> a) -> Type) (a6989586621680379294 :: [a]) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply ((!!@#@$) :: TyFun [a] (Nat ~> a) -> Type) (a6989586621680379294 :: [a]) = (!!@#@$$) a6989586621680379294
type Apply (Let6989586621681501296LoopSym1 cnt06989586621681501294 :: TyFun (m6989586621681500906 a) (TyFun Nat (m6989586621681500906 ()) -> Type) -> Type) (f6989586621681501295 :: m6989586621681500906 a) 
Instance details

Defined in Data.Singletons.Prelude.Monad

type Apply (Let6989586621681501296LoopSym1 cnt06989586621681501294 :: TyFun (m6989586621681500906 a) (TyFun Nat (m6989586621681500906 ()) -> Type) -> Type) (f6989586621681501295 :: m6989586621681500906 a) = Let6989586621681501296LoopSym2 cnt06989586621681501294 f6989586621681501295
type Apply (Let6989586621681501314LoopSym1 cnt06989586621681501312 :: TyFun (m6989586621681500908 a6989586621681500909) (TyFun Nat (m6989586621681500908 [a6989586621681500909]) -> Type) -> Type) (f6989586621681501313 :: m6989586621681500908 a6989586621681500909) 
Instance details

Defined in Data.Singletons.Prelude.Monad

type Apply (Let6989586621681501314LoopSym1 cnt06989586621681501312 :: TyFun (m6989586621681500908 a6989586621681500909) (TyFun Nat (m6989586621681500908 [a6989586621681500909]) -> Type) -> Type) (f6989586621681501313 :: m6989586621681500908 a6989586621681500909) = Let6989586621681501314LoopSym2 cnt06989586621681501312 f6989586621681501313
type Apply (Length_6989586621680823420Sym0 :: TyFun (Either a1 a2) Nat -> Type) (a6989586621680823424 :: Either a1 a2) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Length_6989586621680823420Sym0 :: TyFun (Either a1 a2) Nat -> Type) (a6989586621680823424 :: Either a1 a2) = Length_6989586621680823420Sym1 a6989586621680823424
type Apply (Length_6989586621680823494Sym0 :: TyFun (Proxy a) Nat -> Type) (a6989586621680823498 :: Proxy a) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Length_6989586621680823494Sym0 :: TyFun (Proxy a) Nat -> Type) (a6989586621680823498 :: Proxy a) = Length_6989586621680823494Sym1 a6989586621680823498
type Apply (FromEnum_6989586621680787258Sym0 :: TyFun (Proxy s) Nat -> Type) (a6989586621680787262 :: Proxy s) 
Instance details

Defined in Data.Singletons.Prelude.Proxy

type Apply (FromEnum_6989586621680787258Sym0 :: TyFun (Proxy s) Nat -> Type) (a6989586621680787262 :: Proxy s) = FromEnum_6989586621680787258Sym1 a6989586621680787262
type Apply (FindIndicesSym0 :: TyFun (a ~> Bool) ([a] ~> [Nat]) -> Type) (a6989586621680379629 :: a ~> Bool) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (FindIndicesSym0 :: TyFun (a ~> Bool) ([a] ~> [Nat]) -> Type) (a6989586621680379629 :: a ~> Bool) = FindIndicesSym1 a6989586621680379629
type Apply (FindIndexSym0 :: TyFun (a ~> Bool) ([a] ~> Maybe Nat) -> Type) (a6989586621680379652 :: a ~> Bool) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (FindIndexSym0 :: TyFun (a ~> Bool) ([a] ~> Maybe Nat) -> Type) (a6989586621680379652 :: a ~> Bool) = FindIndexSym1 a6989586621680379652
type Apply (FromEnum_6989586621681044553Sym0 :: TyFun (Const a b) Nat -> Type) (a6989586621681044557 :: Const a b) 
Instance details

Defined in Data.Singletons.Prelude.Const

type Apply (FromEnum_6989586621681044553Sym0 :: TyFun (Const a b) Nat -> Type) (a6989586621681044557 :: Const a b) = FromEnum_6989586621681044553Sym1 a6989586621681044557

type family (a :: Nat) + (b :: Nat) :: Nat where ... infixl 6 #

Addition of type-level naturals.

Since: base-4.7.0.0

type family (a :: Nat) * (b :: Nat) :: Nat where ... infixl 7 #

Multiplication of type-level naturals.

Since: base-4.7.0.0

type family (a :: Nat) ^ (b :: Nat) :: Nat where ... infixr 8 #

Exponentiation of type-level naturals.

Since: base-4.7.0.0

type family (a :: Nat) <=? (b :: Nat) :: Bool where ... infix 4 #

Comparison of type-level naturals, as a function. NOTE: The functionality for this function should be subsumed by CmpNat, so this might go away in the future. Please let us know, if you encounter discrepancies between the two.

type family (a :: Nat) - (b :: Nat) :: Nat where ... infixl 6 #

Subtraction of type-level naturals.

Since: base-4.7.0.0

type family CmpNat (a :: Nat) (b :: Nat) :: Ordering where ... #

Comparison of type-level naturals, as a function.

Since: base-4.7.0.0

type family Div (a :: Nat) (b :: Nat) :: Nat where ... infixl 7 #

Division (round down) of natural numbers. Div x 0 is undefined (i.e., it cannot be reduced).

Since: base-4.11.0.0

type family Mod (a :: Nat) (b :: Nat) :: Nat where ... infixl 7 #

Modulus of natural numbers. Mod x 0 is undefined (i.e., it cannot be reduced).

Since: base-4.11.0.0

type family Log2 (a :: Nat) :: Nat where ... #

Log base 2 (round down) of natural numbers. Log 0 is undefined (i.e., it cannot be reduced).

Since: base-4.11.0.0

someNatVal :: Natural -> SomeNat #

Convert an integer into an unknown type-level natural.

Since: base-4.10.0.0

natVal' :: forall (n :: Nat). KnownNat n => Proxy# n -> Natural #

Since: base-4.10.0.0

natVal :: forall (n :: Nat) proxy. KnownNat n => proxy n -> Natural #

Since: base-4.10.0.0

data SomeNat #

This type represents unknown type-level natural numbers.

Since: base-4.10.0.0

Constructors

KnownNat n => SomeNat (Proxy n) 

Instances

Instances details
Eq SomeNat

Since: base-4.7.0.0

Instance details

Defined in GHC.TypeNats

Methods

(==) :: SomeNat -> SomeNat -> Bool #

(/=) :: SomeNat -> SomeNat -> Bool #

Ord SomeNat

Since: base-4.7.0.0

Instance details

Defined in GHC.TypeNats

Read SomeNat

Since: base-4.7.0.0

Instance details

Defined in GHC.TypeNats

Show SomeNat

Since: base-4.7.0.0

Instance details

Defined in GHC.TypeNats

type (<=) (x :: Nat) (y :: Nat) = (x <=? y) ~ 'True infix 4 #

Comparison of type-level naturals, as a constraint.

Since: base-4.7.0.0

withSingI :: forall k (n :: k) r. Sing n -> (SingI n => r) -> r #

type family Demote k = (r :: Type) | r -> k #

Instances

Instances details
type Demote Bool 
Instance details

Defined in Data.Singletons.Prelude.Instances

type Demote Ordering 
Instance details

Defined in Data.Singletons.Prelude.Instances

type Demote Nat 
Instance details

Defined in Data.Singletons.TypeLits.Internal

type Demote Symbol 
Instance details

Defined in Data.Singletons.TypeLits.Internal

type Demote () 
Instance details

Defined in Data.Singletons.Prelude.Instances

type Demote () = ()
type Demote Void 
Instance details

Defined in Data.Singletons.Prelude.Instances

type Demote All 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Demote All = All
type Demote Any 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Demote Any = Any
type Demote [a] 
Instance details

Defined in Data.Singletons.Prelude.Instances

type Demote [a] = [Demote a]
type Demote (Maybe a) 
Instance details

Defined in Data.Singletons.Prelude.Instances

type Demote (Maybe a) = Maybe (Demote a)
type Demote (Down a) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Demote (Down a) = Down (Demote a)
type Demote (Min a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Demote (Min a) = Min (Demote a)
type Demote (Max a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Demote (Max a) = Max (Demote a)
type Demote (First a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Demote (First a) = First (Demote a)
type Demote (Last a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Demote (Last a) = Last (Demote a)
type Demote (WrappedMonoid m) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Demote (Option a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Demote (Option a) = Option (Demote a)
type Demote (Identity a) 
Instance details

Defined in Data.Singletons.Prelude.Instances

type Demote (First a) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Demote (First a) = First (Demote a)
type Demote (Last a) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Demote (Last a) = Last (Demote a)
type Demote (Dual a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Demote (Dual a) = Dual (Demote a)
type Demote (Sum a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Demote (Sum a) = Sum (Demote a)
type Demote (Product a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Demote (Product a) = Product (Demote a)
type Demote (NonEmpty a) 
Instance details

Defined in Data.Singletons.Prelude.Instances

type Demote (MaxInternal a) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Demote (MaxInternal a) = MaxInternal (Demote a)
type Demote (MinInternal a) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Demote (MinInternal a) = MinInternal (Demote a)
type Demote (Either a b) 
Instance details

Defined in Data.Singletons.Prelude.Instances

type Demote (Either a b) = Either (Demote a) (Demote b)
type Demote (a, b) 
Instance details

Defined in Data.Singletons.Prelude.Instances

type Demote (a, b) = (Demote a, Demote b)
type Demote (Arg a b) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Demote (Arg a b) = Arg (Demote a) (Demote b)
type Demote (Proxy t) 
Instance details

Defined in Data.Singletons.Prelude.Proxy

type Demote (Proxy t) = Proxy t
type Demote (WrappedSing a) 
Instance details

Defined in Data.Singletons.Internal

type Demote (WrappedSing a) = WrappedSing a
type Demote (k1 ~> k2) 
Instance details

Defined in Data.Singletons.Internal

type Demote (k1 ~> k2) = Demote k1 -> Demote k2
type Demote (a, b, c) 
Instance details

Defined in Data.Singletons.Prelude.Instances

type Demote (a, b, c) = (Demote a, Demote b, Demote c)
type Demote (Const a b) 
Instance details

Defined in Data.Singletons.Prelude.Const

type Demote (Const a b) = Const (Demote a) b
type Demote (a, b, c, d) 
Instance details

Defined in Data.Singletons.Prelude.Instances

type Demote (a, b, c, d) = (Demote a, Demote b, Demote c, Demote d)
type Demote (a, b, c, d, e) 
Instance details

Defined in Data.Singletons.Prelude.Instances

type Demote (a, b, c, d, e) = (Demote a, Demote b, Demote c, Demote d, Demote e)
type Demote (a, b, c, d, e, f) 
Instance details

Defined in Data.Singletons.Prelude.Instances

type Demote (a, b, c, d, e, f) = (Demote a, Demote b, Demote c, Demote d, Demote e, Demote f)
type Demote (a, b, c, d, e, f, g) 
Instance details

Defined in Data.Singletons.Prelude.Instances

type Demote (a, b, c, d, e, f, g) = (Demote a, Demote b, Demote c, Demote d, Demote e, Demote f, Demote g)

type family Sing :: k -> Type #

Instances

Instances details
type Sing 
Instance details

Defined in Data.Singletons.Prelude.Instances

type Sing = SBool
type Sing 
Instance details

Defined in Data.Singletons.Prelude.Instances

type Sing = SOrdering
type Sing 
Instance details

Defined in Data.Singletons.TypeLits.Internal

type Sing = SNat
type Sing 
Instance details

Defined in Data.Singletons.TypeLits.Internal

type Sing = SSymbol
type Sing 
Instance details

Defined in Data.Singletons.Prelude.Instances

type Sing = STuple0
type Sing 
Instance details

Defined in Data.Singletons.Prelude.Instances

type Sing = SVoid
type Sing 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Sing = SAll
type Sing 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Sing = SAny
type Sing 
Instance details

Defined in Data.Singletons.Prelude.Instances

type Sing = SList :: [a] -> Type
type Sing 
Instance details

Defined in Data.Singletons.Prelude.Instances

type Sing = SMaybe :: Maybe a -> Type
type Sing 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Sing = SDown :: Down a -> Type
type Sing 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Sing = SMin :: Min a -> Type
type Sing 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Sing = SMax :: Max a -> Type
type Sing 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Sing = SFirst :: First a -> Type
type Sing 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Sing = SLast :: Last a -> Type
type Sing 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Sing = SWrappedMonoid :: WrappedMonoid m -> Type
type Sing 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Sing = SOption :: Option a -> Type
type Sing 
Instance details

Defined in Data.Singletons.Prelude.Instances

type Sing = SIdentity :: Identity a -> Type
type Sing 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Sing = SFirst :: First a -> Type
type Sing 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Sing = SLast :: Last a -> Type
type Sing 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Sing = SDual :: Dual a -> Type
type Sing 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Sing = SSum :: Sum a -> Type
type Sing 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Sing = SProduct :: Product a -> Type
type Sing 
Instance details

Defined in Data.Singletons.Prelude.Instances

type Sing = SNonEmpty :: NonEmpty a -> Type
type Sing 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Sing = SEndo :: Endo a -> Type
type Sing 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Sing = SMaxInternal :: MaxInternal a -> Type
type Sing 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Sing = SMinInternal :: MinInternal a -> Type
type Sing 
Instance details

Defined in Data.Singletons.Prelude.Instances

type Sing = SEither :: Either a b -> Type
type Sing 
Instance details

Defined in Data.Singletons.Prelude.Instances

type Sing = STuple2 :: (a, b) -> Type
type Sing 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Sing = SArg :: Arg a b -> Type
type Sing 
Instance details

Defined in Data.Singletons.Prelude.Proxy

type Sing = SProxy :: Proxy t -> Type
type Sing 
Instance details

Defined in Data.Singletons.Internal

type Sing = SWrappedSing :: WrappedSing a -> Type
type Sing 
Instance details

Defined in Data.Singletons.Internal

type Sing = SLambda :: (k1 ~> k2) -> Type
type Sing 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type Sing = SStateL :: StateL s a -> Type
type Sing 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type Sing = SStateR :: StateR s a -> Type
type Sing 
Instance details

Defined in Data.Singletons.Prelude.Instances

type Sing = STuple3 :: (a, b, c) -> Type
type Sing 
Instance details

Defined in Data.Singletons.Prelude.Const

type Sing = SConst :: Const a b -> Type
type Sing 
Instance details

Defined in Data.Singletons.Prelude.Instances

type Sing = STuple4 :: (a, b, c, d) -> Type
type Sing 
Instance details

Defined in Data.Singletons.Prelude.Instances

type Sing = STuple5 :: (a, b, c, d, e) -> Type
type Sing 
Instance details

Defined in Data.Singletons.Prelude.Instances

type Sing = STuple6 :: (a, b, c, d, e, f) -> Type
type Sing 
Instance details

Defined in Data.Singletons.Prelude.Instances

type Sing = STuple7 :: (a, b, c, d, e, f, g) -> Type

class SingI (a :: k) where #

Methods

sing :: Sing a #

Instances

Instances details
SingI n => SingI ('MaxInternal n :: MaxInternal a) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

Methods

sing :: Sing ('MaxInternal n) #

SingI n => SingI ('MinInternal n :: MinInternal a) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

Methods

sing :: Sing ('MinInternal n) #

SingI NotSym0 
Instance details

Defined in Data.Singletons.Prelude.Bool

Methods

sing :: Sing NotSym0 #

SingI (&&@#@$) 
Instance details

Defined in Data.Singletons.Prelude.Bool

Methods

sing :: Sing (&&@#@$) #

SingI (||@#@$) 
Instance details

Defined in Data.Singletons.Prelude.Bool

Methods

sing :: Sing (||@#@$) #

SingI Log2Sym0 
Instance details

Defined in Data.Singletons.TypeLits

Methods

sing :: Sing Log2Sym0 #

SingI (<=?@#@$) 
Instance details

Defined in Data.Singletons.TypeLits.Internal

Methods

sing :: Sing (<=?@#@$) #

SingI (^@#@$) 
Instance details

Defined in Data.Singletons.TypeLits.Internal

Methods

sing :: Sing (^@#@$) #

SingI DivSym0 
Instance details

Defined in Data.Singletons.TypeLits

Methods

sing :: Sing DivSym0 #

SingI ModSym0 
Instance details

Defined in Data.Singletons.TypeLits

Methods

sing :: Sing ModSym0 #

SingI AllSym0 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

Methods

sing :: Sing AllSym0 #

SingI All_Sym0 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal.Disambiguation

Methods

sing :: Sing All_Sym0 #

SingI AnySym0 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

Methods

sing :: Sing AnySym0 #

SingI Any_Sym0 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal.Disambiguation

Methods

sing :: Sing Any_Sym0 #

SingI ShowParenSym0 
Instance details

Defined in Data.Singletons.Prelude.Show

Methods

sing :: Sing ShowParenSym0 #

SingI AndSym0 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing AndSym0 #

SingI OrSym0 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing OrSym0 #

SingI UnlinesSym0 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing UnlinesSym0 #

SingI UnwordsSym0 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing UnwordsSym0 #

SingI Show_tupleSym0 
Instance details

Defined in Data.Singletons.Prelude.Show

Methods

sing :: Sing Show_tupleSym0 #

SingI ThenCmpSym0 
Instance details

Defined in Data.Singletons.Prelude.Ord

Methods

sing :: Sing ThenCmpSym0 #

SingI EftNatSym0 
Instance details

Defined in Data.Singletons.Prelude.Enum

Methods

sing :: Sing EftNatSym0 #

SingI EfdtNatDnSym0 
Instance details

Defined in Data.Singletons.Prelude.Enum

Methods

sing :: Sing EfdtNatDnSym0 #

SingI EfdtNatSym0 
Instance details

Defined in Data.Singletons.Prelude.Enum

Methods

sing :: Sing EfdtNatSym0 #

SingI EfdtNatUpSym0 
Instance details

Defined in Data.Singletons.Prelude.Enum

Methods

sing :: Sing EfdtNatUpSym0 #

SingI ShowSpaceSym0 
Instance details

Defined in Data.Singletons.Prelude.Show

Methods

sing :: Sing ShowSpaceSym0 #

SingI ShowCommaSpaceSym0 
Instance details

Defined in Data.Singletons.Prelude.Show

Methods

sing :: Sing ShowCommaSpaceSym0 #

SingI ShowCharSym0 
Instance details

Defined in Data.Singletons.Prelude.Show

Methods

sing :: Sing ShowCharSym0 #

SingI ShowStringSym0 
Instance details

Defined in Data.Singletons.Prelude.Show

Methods

sing :: Sing ShowStringSym0 #

SingI GetAllSym0 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

Methods

sing :: Sing GetAllSym0 #

SingI GetAnySym0 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

Methods

sing :: Sing GetAnySym0 #

SingI x => SingI ((&&@#@$$) x :: TyFun Bool Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Bool

Methods

sing :: Sing ((&&@#@$$) x) #

SingI x => SingI ((||@#@$$) x :: TyFun Bool Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Bool

Methods

sing :: Sing ((||@#@$$) x) #

SingI x => SingI ((<=?@#@$$) x :: TyFun Nat Bool -> Type) 
Instance details

Defined in Data.Singletons.TypeLits.Internal

Methods

sing :: Sing ((<=?@#@$$) x) #

SingI x => SingI ((^@#@$$) x :: TyFun Nat Nat -> Type) 
Instance details

Defined in Data.Singletons.TypeLits.Internal

Methods

sing :: Sing ((^@#@$$) x) #

SingI x => SingI (DivSym1 x :: TyFun Nat Nat -> Type) 
Instance details

Defined in Data.Singletons.TypeLits

Methods

sing :: Sing (DivSym1 x) #

SingI x => SingI (ModSym1 x :: TyFun Nat Nat -> Type) 
Instance details

Defined in Data.Singletons.TypeLits

Methods

sing :: Sing (ModSym1 x) #

SAlternative f => SingI (GuardSym0 :: TyFun Bool (f ()) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

Methods

sing :: Sing GuardSym0 #

SApplicative f => SingI (WhenSym0 :: TyFun Bool (f () ~> f ()) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

Methods

sing :: Sing WhenSym0 #

SApplicative f => SingI (UnlessSym0 :: TyFun Bool (f () ~> f ()) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad

Methods

sing :: Sing UnlessSym0 #

SingI (ListtransposeSym0 :: TyFun [[a]] [[a]] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

Methods

sing :: Sing ListtransposeSym0 #

SingI (TransposeSym0 :: TyFun [[a]] [[a]] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing TransposeSym0 #

SingI (ConcatSym0 :: TyFun [[a]] [a] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing ConcatSym0 #

SingI (CatMaybesSym0 :: TyFun [Maybe a] [a] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Maybe

Methods

sing :: Sing CatMaybesSym0 #

SingI (ListToMaybeSym0 :: TyFun [a] (Maybe a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Maybe

Methods

sing :: Sing ListToMaybeSym0 #

SingI (ListtailsSym0 :: TyFun [a] [[a]] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

Methods

sing :: Sing ListtailsSym0 #

SNum a => SingI (ListsumSym0 :: TyFun [a] a -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

Methods

sing :: Sing ListsumSym0 #

SOrd a => SingI (ListsortSym0 :: TyFun [a] [a] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

Methods

sing :: Sing ListsortSym0 #

SingI (ListreverseSym0 :: TyFun [a] [a] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

Methods

sing :: Sing ListreverseSym0 #

SNum a => SingI (ListproductSym0 :: TyFun [a] a -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

Methods

sing :: Sing ListproductSym0 #

SingI (ListnullSym0 :: TyFun [a] Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

Methods

sing :: Sing ListnullSym0 #

SOrd a => SingI (ListminimumSym0 :: TyFun [a] a -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

Methods

sing :: Sing ListminimumSym0 #

SOrd a => SingI (ListmaximumSym0 :: TyFun [a] a -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

Methods

sing :: Sing ListmaximumSym0 #

SingI (ListlengthSym0 :: TyFun [a] Nat -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

Methods

sing :: Sing ListlengthSym0 #

SingI (ListlastSym0 :: TyFun [a] a -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

Methods

sing :: Sing ListlastSym0 #

SEq a => SingI (ListisPrefixOfSym0 :: TyFun [a] ([a] ~> Bool) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

Methods

sing :: Sing ListisPrefixOfSym0 #

SingI (ListinitsSym0 :: TyFun [a] [[a]] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

Methods

sing :: Sing ListinitsSym0 #

SingI (ListinitSym0 :: TyFun [a] [a] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

Methods

sing :: Sing ListinitSym0 #

SingI (ListindexSym0 :: TyFun [a] (Nat ~> a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

Methods

sing :: Sing ListindexSym0 #

SEq a => SingI ((\\@#@$) :: TyFun [a] ([a] ~> [a]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing (\\@#@$) #

SEq a => SingI (UnionSym0 :: TyFun [a] ([a] ~> [a]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing UnionSym0 #

SingI (TailsSym0 :: TyFun [a] [[a]] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing TailsSym0 #

SingI (TailSym0 :: TyFun [a] [a] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing TailSym0 #

SNum a => SingI (SumSym0 :: TyFun [a] a -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing SumSym0 #

SingI (SubsequencesSym0 :: TyFun [a] [[a]] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing SubsequencesSym0 #

SOrd a => SingI (SortSym0 :: TyFun [a] [a] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing SortSym0 #

SingI (ReverseSym0 :: TyFun [a] [a] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing ReverseSym0 #

SNum a => SingI (ProductSym0 :: TyFun [a] a -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing ProductSym0 #

SingI (PermutationsSym0 :: TyFun [a] [[a]] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing PermutationsSym0 #

SingI (NullSym0 :: TyFun [a] Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing NullSym0 #

SEq a => SingI (NubSym0 :: TyFun [a] [a] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing NubSym0 #

SingI (NonEmptySubsequencesSym0 :: TyFun [a] [[a]] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing NonEmptySubsequencesSym0 #

SOrd a => SingI (MinimumSym0 :: TyFun [a] a -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing MinimumSym0 #

SOrd a => SingI (MaximumSym0 :: TyFun [a] a -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing MaximumSym0 #

SingI (LengthSym0 :: TyFun [a] Nat -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing LengthSym0 #

SingI (LastSym0 :: TyFun [a] a -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing LastSym0 #

SEq a => SingI (IsSuffixOfSym0 :: TyFun [a] ([a] ~> Bool) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing IsSuffixOfSym0 #

SEq a => SingI (IsPrefixOfSym0 :: TyFun [a] ([a] ~> Bool) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing IsPrefixOfSym0 #

SEq a => SingI (IsInfixOfSym0 :: TyFun [a] ([a] ~> Bool) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing IsInfixOfSym0 #

SEq a => SingI (IntersectSym0 :: TyFun [a] ([a] ~> [a]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing IntersectSym0 #

SingI (IntercalateSym0 :: TyFun [a] ([[a]] ~> [a]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing IntercalateSym0 #

SingI (InitsSym0 :: TyFun [a] [[a]] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing InitsSym0 #

SingI (InitSym0 :: TyFun [a] [a] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing InitSym0 #

SingI (HeadSym0 :: TyFun [a] a -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing HeadSym0 #

SEq a => SingI (GroupSym0 :: TyFun [a] [[a]] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing GroupSym0 #

SingI ((!!@#@$) :: TyFun [a] (Nat ~> a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing (!!@#@$) #

SShow a => SingI (ShowListSym0 :: TyFun [a] (Symbol ~> Symbol) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

Methods

sing :: Sing ShowListSym0 #

SingI ((++@#@$) :: TyFun [a] ([a] ~> [a]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Base

Methods

sing :: Sing (++@#@$) #

SMonoid a => SingI (MconcatSym0 :: TyFun [a] a -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

Methods

sing :: Sing MconcatSym0 #

SingI (MaybeToListSym0 :: TyFun (Maybe a) [a] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Maybe

Methods

sing :: Sing MaybeToListSym0 #

SingI (IsNothingSym0 :: TyFun (Maybe a) Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Maybe

Methods

sing :: Sing IsNothingSym0 #

SingI (IsJustSym0 :: TyFun (Maybe a) Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Maybe

Methods

sing :: Sing IsJustSym0 #

SingI (FromJustSym0 :: TyFun (Maybe a) a -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Maybe

Methods

sing :: Sing FromJustSym0 #

SingI (MinInternalSym0 :: TyFun (Maybe a) (MinInternal a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

Methods

sing :: Sing MinInternalSym0 #

SingI (MaxInternalSym0 :: TyFun (Maybe a) (MaxInternal a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

Methods

sing :: Sing MaxInternalSym0 #

SingI (OptionSym0 :: TyFun (Maybe a) (Option a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

Methods

sing :: Sing OptionSym0 #

SingI (LastSym0 :: TyFun (Maybe a) (Last a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

Methods

sing :: Sing LastSym0 #

SingI (FirstSym0 :: TyFun (Maybe a) (First a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

Methods

sing :: Sing FirstSym0 #

SingI d => SingI (ThenCmpSym1 d :: TyFun Ordering Ordering -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

Methods

sing :: Sing (ThenCmpSym1 d) #

SingI d => SingI (EftNatSym1 d :: TyFun Nat [Nat] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Enum

Methods

sing :: Sing (EftNatSym1 d) #

SEnum a => SingI (ToEnumSym0 :: TyFun Nat a -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Enum

Methods

sing :: Sing ToEnumSym0 #

SNum a => SingI (FromIntegerSym0 :: TyFun Nat a -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Num

Methods

sing :: Sing FromIntegerSym0 #

SingI (ListtakeSym0 :: TyFun Nat ([a] ~> [a]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

Methods

sing :: Sing ListtakeSym0 #

SingI (ListsplitAtSym0 :: TyFun Nat ([a] ~> ([a], [a])) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

Methods

sing :: Sing ListsplitAtSym0 #

SingI (ListdropSym0 :: TyFun Nat ([a] ~> [a]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

Methods

sing :: Sing ListdropSym0 #

SingI (TakeSym0 :: TyFun Nat ([a] ~> [a]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing TakeSym0 #

SingI (SplitAtSym0 :: TyFun Nat ([a] ~> ([a], [a])) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing SplitAtSym0 #

SingI (DropSym0 :: TyFun Nat ([a] ~> [a]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing DropSym0 #

SingI d => SingI (EfdtNatDnSym1 d :: TyFun Nat (Nat ~> [Nat]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Enum

Methods

sing :: Sing (EfdtNatDnSym1 d) #

SingI d => SingI (EfdtNatSym1 d :: TyFun Nat (Nat ~> [Nat]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Enum

Methods

sing :: Sing (EfdtNatSym1 d) #

SingI d => SingI (EfdtNatUpSym1 d :: TyFun Nat (Nat ~> [Nat]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Enum

Methods

sing :: Sing (EfdtNatUpSym1 d) #

SingI (ReplicateSym0 :: TyFun Nat (a ~> [a]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing ReplicateSym0 #

SShow a => SingI (ShowsPrecSym0 :: TyFun Nat (a ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

Methods

sing :: Sing ShowsPrecSym0 #

SingI d => SingI (ShowCharSym1 d :: TyFun Symbol Symbol -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

Methods

sing :: Sing (ShowCharSym1 d) #

SingI d => SingI (ShowStringSym1 d :: TyFun Symbol Symbol -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

Methods

sing :: Sing (ShowStringSym1 d) #

SingI d => SingI (Show_tupleSym1 d :: TyFun Symbol Symbol -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

Methods

sing :: Sing (Show_tupleSym1 d) #

SIsString a => SingI (FromStringSym0 :: TyFun Symbol a -> Type) 
Instance details

Defined in Data.Singletons.Prelude.IsString

Methods

sing :: Sing FromStringSym0 #

SingI (Sum_Sym0 :: TyFun a (Sum a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal.Disambiguation

Methods

sing :: Sing Sum_Sym0 #

SingI (Product_Sym0 :: TyFun a (Product a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal.Disambiguation

Methods

sing :: Sing Product_Sym0 #

SOrd a => SingI (Min_Sym0 :: TyFun a (a ~> a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord.Disambiguation

Methods

sing :: Sing Min_Sym0 #

SOrd a => SingI (Max_Sym0 :: TyFun a (a ~> a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord.Disambiguation

Methods

sing :: Sing Max_Sym0 #

SingI (FromMaybeSym0 :: TyFun a (Maybe a ~> a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Maybe

Methods

sing :: Sing FromMaybeSym0 #

SingI (ListintersperseSym0 :: TyFun a ([a] ~> [a]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

Methods

sing :: Sing ListintersperseSym0 #

SOrd a => SingI (ListinsertSym0 :: TyFun a ([a] ~> [a]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

Methods

sing :: Sing ListinsertSym0 #

SEq a => SingI (ListelemSym0 :: TyFun a ([a] ~> Bool) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

Methods

sing :: Sing ListelemSym0 #

SingI (PrependToAllSym0 :: TyFun a ([a] ~> [a]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing PrependToAllSym0 #

SEq a => SingI (NotElemSym0 :: TyFun a ([a] ~> Bool) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing NotElemSym0 #

SingI (IntersperseSym0 :: TyFun a ([a] ~> [a]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing IntersperseSym0 #

SOrd a => SingI (InsertSym0 :: TyFun a ([a] ~> [a]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing InsertSym0 #

SEq a => SingI (ElemSym0 :: TyFun a ([a] ~> Bool) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing ElemSym0 #

SEq a => SingI (ElemIndicesSym0 :: TyFun a ([a] ~> [Nat]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing ElemIndicesSym0 #

SEq a => SingI (ElemIndexSym0 :: TyFun a ([a] ~> Maybe Nat) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing ElemIndexSym0 #

SEq a => SingI (DeleteSym0 :: TyFun a ([a] ~> [a]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing DeleteSym0 #

SShow a => SingI (ShowsSym0 :: TyFun a (Symbol ~> Symbol) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

Methods

sing :: Sing ShowsSym0 #

SShow a => SingI (Show_Sym0 :: TyFun a Symbol -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

Methods

sing :: Sing Show_Sym0 #

SEnum a => SingI (SuccSym0 :: TyFun a a -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Enum

Methods

sing :: Sing SuccSym0 #

SEnum a => SingI (PredSym0 :: TyFun a a -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Enum

Methods

sing :: Sing PredSym0 #

SEnum a => SingI (FromEnumSym0 :: TyFun a Nat -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Enum

Methods

sing :: Sing FromEnumSym0 #

SEnum a => SingI (EnumFromToSym0 :: TyFun a (a ~> [a]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Enum

Methods

sing :: Sing EnumFromToSym0 #

SEnum a => SingI (EnumFromThenToSym0 :: TyFun a (a ~> (a ~> [a])) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Enum

Methods

sing :: Sing EnumFromThenToSym0 #

SFoldable t => SingI (OrSym0 :: TyFun (t Bool) Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

Methods

sing :: Sing OrSym0 #

SFoldable t => SingI (AndSym0 :: TyFun (t Bool) Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

Methods

sing :: Sing AndSym0 #

SEq a => SingI ((==@#@$) :: TyFun a (a ~> Bool) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Eq

Methods

sing :: Sing (==@#@$) #

SEq a => SingI ((/=@#@$) :: TyFun a (a ~> Bool) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Eq

Methods

sing :: Sing (/=@#@$) #

SNum a => SingI (SubtractSym0 :: TyFun a (a ~> a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Num

Methods

sing :: Sing SubtractSym0 #

SNum a => SingI (SignumSym0 :: TyFun a a -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Num

Methods

sing :: Sing SignumSym0 #

SNum a => SingI (NegateSym0 :: TyFun a a -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Num

Methods

sing :: Sing NegateSym0 #

SNum a => SingI (AbsSym0 :: TyFun a a -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Num

Methods

sing :: Sing AbsSym0 #

SNum a => SingI ((-@#@$) :: TyFun a (a ~> a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Num

Methods

sing :: Sing (-@#@$) #

SNum a => SingI ((+@#@$) :: TyFun a (a ~> a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Num

Methods

sing :: Sing (+@#@$) #

SNum a => SingI ((*@#@$) :: TyFun a (a ~> a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Num

Methods

sing :: Sing (*@#@$) #

SingI (Bool_Sym0 :: TyFun a (a ~> (Bool ~> a)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Bool

Methods

sing :: Sing Bool_Sym0 #

SingI (IdSym0 :: TyFun a a -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Base

Methods

sing :: Sing IdSym0 #

SingI (AsTypeOfSym0 :: TyFun a (a ~> a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Base

Methods

sing :: Sing AsTypeOfSym0 #

SingI (JustSym0 :: TyFun a (Maybe a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Instances

Methods

sing :: Sing JustSym0 #

SingI (IdentitySym0 :: TyFun a (Identity a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Instances

Methods

sing :: Sing IdentitySym0 #

SingI ((:|@#@$) :: TyFun a ([a] ~> NonEmpty a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Instances

Methods

sing :: Sing (:|@#@$) #

SingI ((:@#@$) :: TyFun a ([a] ~> [a]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Instances

Methods

sing :: Sing (:@#@$) #

SOrd a => SingI (MinSym0 :: TyFun a (a ~> a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

Methods

sing :: Sing MinSym0 #

SOrd a => SingI (MaxSym0 :: TyFun a (a ~> a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

Methods

sing :: Sing MaxSym0 #

SingI (DownSym0 :: TyFun a (Down a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

Methods

sing :: Sing DownSym0 #

SOrd a => SingI (CompareSym0 :: TyFun a (a ~> Ordering) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

Methods

sing :: Sing CompareSym0 #

SOrd a => SingI ((>@#@$) :: TyFun a (a ~> Bool) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

Methods

sing :: Sing (>@#@$) #

SOrd a => SingI ((>=@#@$) :: TyFun a (a ~> Bool) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

Methods

sing :: Sing (>=@#@$) #

SOrd a => SingI ((<@#@$) :: TyFun a (a ~> Bool) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

Methods

sing :: Sing (<@#@$) #

SOrd a => SingI ((<=@#@$) :: TyFun a (a ~> Bool) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

Methods

sing :: Sing (<=@#@$) #

SingI (WrapMonoidSym0 :: TyFun m (WrappedMonoid m) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

Methods

sing :: Sing WrapMonoidSym0 #

SingI (SumSym0 :: TyFun a (Sum a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

Methods

sing :: Sing SumSym0 #

SingI (ProductSym0 :: TyFun a (Product a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

Methods

sing :: Sing ProductSym0 #

SingI (MinSym0 :: TyFun a (Min a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

Methods

sing :: Sing MinSym0 #

SingI (MaxSym0 :: TyFun a (Max a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

Methods

sing :: Sing MaxSym0 #

SingI (LastSym0 :: TyFun a (Last a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

Methods

sing :: Sing LastSym0 #

SingI (FirstSym0 :: TyFun a (First a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

Methods

sing :: Sing FirstSym0 #

SingI (DualSym0 :: TyFun a (Dual a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

Methods

sing :: Sing DualSym0 #

SSemigroup a => SingI ((<>@#@$) :: TyFun a (a ~> a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

Methods

sing :: Sing (<>@#@$) #

SMonoid a => SingI (MappendSym0 :: TyFun a (a ~> a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

Methods

sing :: Sing MappendSym0 #

SingI (GetDownSym0 :: TyFun (Down a) a -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

Methods

sing :: Sing GetDownSym0 #

SingI (GetMinSym0 :: TyFun (Min a) a -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

Methods

sing :: Sing GetMinSym0 #

SingI (GetMaxSym0 :: TyFun (Max a) a -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

Methods

sing :: Sing GetMaxSym0 #

SingI (GetFirstSym0 :: TyFun (First a) a -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

Methods

sing :: Sing GetFirstSym0 #

SingI (GetLastSym0 :: TyFun (Last a) a -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

Methods

sing :: Sing GetLastSym0 #

SingI (UnwrapMonoidSym0 :: TyFun (WrappedMonoid m) m -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

Methods

sing :: Sing UnwrapMonoidSym0 #

SingI (GetOptionSym0 :: TyFun (Option a) (Maybe a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

Methods

sing :: Sing GetOptionSym0 #

SingI (RunIdentitySym0 :: TyFun (Identity a) a -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Instances

Methods

sing :: Sing RunIdentitySym0 #

SingI (GetFirstSym0 :: TyFun (First a) (Maybe a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

Methods

sing :: Sing GetFirstSym0 #

SingI (GetLastSym0 :: TyFun (Last a) (Maybe a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

Methods

sing :: Sing GetLastSym0 #

SingI (GetDualSym0 :: TyFun (Dual a) a -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

Methods

sing :: Sing GetDualSym0 #

SingI (GetSumSym0 :: TyFun (Sum a) a -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

Methods

sing :: Sing GetSumSym0 #

SingI (GetProductSym0 :: TyFun (Product a) a -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

Methods

sing :: Sing GetProductSym0 #

SSemigroup a => SingI (SconcatSym0 :: TyFun (NonEmpty a) a -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

Methods

sing :: Sing SconcatSym0 #

SingI d => SingI (ShowParenSym1 d :: TyFun (Symbol ~> Symbol) (Symbol ~> Symbol) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

Methods

sing :: Sing (ShowParenSym1 d) #

SingI (ListtakeWhileSym0 :: TyFun (a ~> Bool) ([a] ~> [a]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

Methods

sing :: Sing ListtakeWhileSym0 #

SingI (ListspanSym0 :: TyFun (a ~> Bool) ([a] ~> ([a], [a])) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

Methods

sing :: Sing ListspanSym0 #

SingI (ListsortBySym0 :: TyFun (a ~> (a ~> Ordering)) ([a] ~> [a]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

Methods

sing :: Sing ListsortBySym0 #

SingI (Listscanr1Sym0 :: TyFun (a ~> (a ~> a)) ([a] ~> [a]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

Methods

sing :: Sing Listscanr1Sym0 #

SingI (ListpartitionSym0 :: TyFun (a ~> Bool) ([a] ~> ([a], [a])) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

Methods

sing :: Sing ListpartitionSym0 #

SingI (ListnubBySym0 :: TyFun (a ~> (a ~> Bool)) ([a] ~> [a]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

Methods

sing :: Sing ListnubBySym0 #

SingI (Listfoldr1Sym0 :: TyFun (a ~> (a ~> a)) ([a] ~> a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

Methods

sing :: Sing Listfoldr1Sym0 #

SingI (Listfoldl1Sym0 :: TyFun (a ~> (a ~> a)) ([a] ~> a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

Methods

sing :: Sing Listfoldl1Sym0 #

SingI (ListfilterSym0 :: TyFun (a ~> Bool) ([a] ~> [a]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

Methods

sing :: Sing ListfilterSym0 #

SingI (ListdropWhileSym0 :: TyFun (a ~> Bool) ([a] ~> [a]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

Methods

sing :: Sing ListdropWhileSym0 #

SingI (UnionBySym0 :: TyFun (a ~> (a ~> Bool)) ([a] ~> ([a] ~> [a])) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing UnionBySym0 #

SingI (TakeWhileSym0 :: TyFun (a ~> Bool) ([a] ~> [a]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing TakeWhileSym0 #

SingI (SpanSym0 :: TyFun (a ~> Bool) ([a] ~> ([a], [a])) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing SpanSym0 #

SingI (SortBySym0 :: TyFun (a ~> (a ~> Ordering)) ([a] ~> [a]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing SortBySym0 #

SingI (SelectSym0 :: TyFun (a ~> Bool) (a ~> (([a], [a]) ~> ([a], [a]))) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing SelectSym0 #

SingI (Scanr1Sym0 :: TyFun (a ~> (a ~> a)) ([a] ~> [a]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing Scanr1Sym0 #

SingI (Scanl1Sym0 :: TyFun (a ~> (a ~> a)) ([a] ~> [a]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing Scanl1Sym0 #

SingI (PartitionSym0 :: TyFun (a ~> Bool) ([a] ~> ([a], [a])) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing PartitionSym0 #

SingI (NubBySym0 :: TyFun (a ~> (a ~> Bool)) ([a] ~> [a]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing NubBySym0 #

SingI (MinimumBySym0 :: TyFun (a ~> (a ~> Ordering)) ([a] ~> a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing MinimumBySym0 #

SingI (MaximumBySym0 :: TyFun (a ~> (a ~> Ordering)) ([a] ~> a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing MaximumBySym0 #

SingI (IntersectBySym0 :: TyFun (a ~> (a ~> Bool)) ([a] ~> ([a] ~> [a])) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing IntersectBySym0 #

SingI (InsertBySym0 :: TyFun (a ~> (a ~> Ordering)) (a ~> ([a] ~> [a])) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing InsertBySym0 #

SingI (GroupBySym0 :: TyFun (a ~> (a ~> Bool)) ([a] ~> [[a]]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing GroupBySym0 #

SingI (Foldr1Sym0 :: TyFun (a ~> (a ~> a)) ([a] ~> a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing Foldr1Sym0 #

SingI (Foldl1Sym0 :: TyFun (a ~> (a ~> a)) ([a] ~> a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing Foldl1Sym0 #

SingI (Foldl1'Sym0 :: TyFun (a ~> (a ~> a)) ([a] ~> a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing Foldl1'Sym0 #

SingI (FindSym0 :: TyFun (a ~> Bool) ([a] ~> Maybe a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing FindSym0 #

SingI (FindIndicesSym0 :: TyFun (a ~> Bool) ([a] ~> [Nat]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing FindIndicesSym0 #

SingI (FindIndexSym0 :: TyFun (a ~> Bool) ([a] ~> Maybe Nat) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing FindIndexSym0 #

SingI (FilterSym0 :: TyFun (a ~> Bool) ([a] ~> [a]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing FilterSym0 #

SingI (Elem_bySym0 :: TyFun (a ~> (a ~> Bool)) (a ~> ([a] ~> Bool)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing Elem_bySym0 #

SingI (DropWhileSym0 :: TyFun (a ~> Bool) ([a] ~> [a]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing DropWhileSym0 #

SingI (DropWhileEndSym0 :: TyFun (a ~> Bool) ([a] ~> [a]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing DropWhileEndSym0 #

SingI (DeleteFirstsBySym0 :: TyFun (a ~> (a ~> Bool)) ([a] ~> ([a] ~> [a])) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing DeleteFirstsBySym0 #

SingI (DeleteBySym0 :: TyFun (a ~> (a ~> Bool)) (a ~> ([a] ~> [a])) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing DeleteBySym0 #

SingI (BreakSym0 :: TyFun (a ~> Bool) ([a] ~> ([a], [a])) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing BreakSym0 #

SingI (AnySym0 :: TyFun (a ~> Bool) ([a] ~> Bool) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing AnySym0 #

SingI (AllSym0 :: TyFun (a ~> Bool) ([a] ~> Bool) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing AllSym0 #

SingI (ShowListWithSym0 :: TyFun (a ~> (Symbol ~> Symbol)) ([a] ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

Methods

sing :: Sing ShowListWithSym0 #

SingI (UntilSym0 :: TyFun (a ~> Bool) ((a ~> a) ~> (a ~> a)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Base

Methods

sing :: Sing UntilSym0 #

SingI (AppEndoSym0 :: TyFun (Endo a) (a ~> a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

Methods

sing :: Sing AppEndoSym0 #

SingI (GetMaxInternalSym0 :: TyFun (MaxInternal a) (Maybe a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

Methods

sing :: Sing GetMaxInternalSym0 #

SingI (GetMinInternalSym0 :: TyFun (MinInternal a) (Maybe a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

Methods

sing :: Sing GetMinInternalSym0 #

SingI d => SingI (IntercalateSym1 d :: TyFun [[a]] [a] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing (IntercalateSym1 d) #

SingI (RightsSym0 :: TyFun [Either a b] [b] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Either

Methods

sing :: Sing RightsSym0 #

SingI (PartitionEithersSym0 :: TyFun [Either a b] ([a], [b]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Either

Methods

sing :: Sing PartitionEithersSym0 #

SingI (LeftsSym0 :: TyFun [Either a b] [a] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Either

Methods

sing :: Sing LeftsSym0 #

SingI (ListunzipSym0 :: TyFun [(a, b)] ([a], [b]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

Methods

sing :: Sing ListunzipSym0 #

SingI (UnzipSym0 :: TyFun [(a, b)] ([a], [b]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing UnzipSym0 #

SingI (ListzipSym0 :: TyFun [a] ([b] ~> [(a, b)]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

Methods

sing :: Sing ListzipSym0 #

SingI d => SingI (ListtakeWhileSym1 d :: TyFun [a] [a] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

Methods

sing :: Sing (ListtakeWhileSym1 d) #

SingI d => SingI (ListtakeSym1 d :: TyFun [a] [a] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

Methods

sing :: Sing (ListtakeSym1 d) #

SingI d => SingI (ListsplitAtSym1 d :: TyFun [a] ([a], [a]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

Methods

sing :: Sing (ListsplitAtSym1 d) #

SingI d => SingI (ListspanSym1 d :: TyFun [a] ([a], [a]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

Methods

sing :: Sing (ListspanSym1 d) #

SingI d => SingI (ListsortBySym1 d :: TyFun [a] [a] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

Methods

sing :: Sing (ListsortBySym1 d) #

SingI d => SingI (Listscanr1Sym1 d :: TyFun [a] [a] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

Methods

sing :: Sing (Listscanr1Sym1 d) #

SingI d => SingI (ListpartitionSym1 d :: TyFun [a] ([a], [a]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

Methods

sing :: Sing (ListpartitionSym1 d) #

SingI d => SingI (ListnubBySym1 d :: TyFun [a] [a] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

Methods

sing :: Sing (ListnubBySym1 d) #

(SEq a, SingI d) => SingI (ListisPrefixOfSym1 d :: TyFun [a] Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

Methods

sing :: Sing (ListisPrefixOfSym1 d) #

SingI d => SingI (ListintersperseSym1 d :: TyFun [a] [a] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

Methods

sing :: Sing (ListintersperseSym1 d) #

(SOrd a, SingI d) => SingI (ListinsertSym1 d :: TyFun [a] [a] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

Methods

sing :: Sing (ListinsertSym1 d) #

SingI d => SingI (Listfoldr1Sym1 d :: TyFun [a] a -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

Methods

sing :: Sing (Listfoldr1Sym1 d) #

SingI d => SingI (Listfoldl1Sym1 d :: TyFun [a] a -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

Methods

sing :: Sing (Listfoldl1Sym1 d) #

SingI d => SingI (ListfilterSym1 d :: TyFun [a] [a] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

Methods

sing :: Sing (ListfilterSym1 d) #

(SEq a, SingI d) => SingI (ListelemSym1 d :: TyFun [a] Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

Methods

sing :: Sing (ListelemSym1 d) #

SingI d => SingI (ListdropWhileSym1 d :: TyFun [a] [a] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

Methods

sing :: Sing (ListdropWhileSym1 d) #

SingI d => SingI (ListdropSym1 d :: TyFun [a] [a] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

Methods

sing :: Sing (ListdropSym1 d) #

(SEq a, SingI d) => SingI ((\\@#@$$) d :: TyFun [a] [a] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing ((\\@#@$$) d) #

SingI (ZipSym0 :: TyFun [a] ([b] ~> [(a, b)]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing ZipSym0 #

(SEq a, SingI d) => SingI (UnionSym1 d :: TyFun [a] [a] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing (UnionSym1 d) #

SingI d => SingI (UnionBySym1 d :: TyFun [a] ([a] ~> [a]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing (UnionBySym1 d) #

SingI d => SingI (TakeWhileSym1 d :: TyFun [a] [a] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing (TakeWhileSym1 d) #

SingI d => SingI (TakeSym1 d :: TyFun [a] [a] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing (TakeSym1 d) #

SingI d => SingI (SplitAtSym1 d :: TyFun [a] ([a], [a]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing (SplitAtSym1 d) #

SingI d => SingI (SpanSym1 d :: TyFun [a] ([a], [a]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing (SpanSym1 d) #

SingI d => SingI (SortBySym1 d :: TyFun [a] [a] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing (SortBySym1 d) #

SingI d => SingI (Scanr1Sym1 d :: TyFun [a] [a] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing (Scanr1Sym1 d) #

SingI d => SingI (Scanl1Sym1 d :: TyFun [a] [a] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing (Scanl1Sym1 d) #

SingI d => SingI (PrependToAllSym1 d :: TyFun [a] [a] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing (PrependToAllSym1 d) #

SingI d => SingI (PartitionSym1 d :: TyFun [a] ([a], [a]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing (PartitionSym1 d) #

SingI d => SingI (NubBySym1 d :: TyFun [a] [a] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing (NubBySym1 d) #

(SEq a, SingI d) => SingI (NotElemSym1 d :: TyFun [a] Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing (NotElemSym1 d) #

SingI d => SingI (MinimumBySym1 d :: TyFun [a] a -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing (MinimumBySym1 d) #

SingI d => SingI (MaximumBySym1 d :: TyFun [a] a -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing (MaximumBySym1 d) #

(SEq a, SingI d) => SingI (IsSuffixOfSym1 d :: TyFun [a] Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing (IsSuffixOfSym1 d) #

(SEq a, SingI d) => SingI (IsPrefixOfSym1 d :: TyFun [a] Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing (IsPrefixOfSym1 d) #

(SEq a, SingI d) => SingI (IsInfixOfSym1 d :: TyFun [a] Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing (IsInfixOfSym1 d) #

SingI d => SingI (IntersperseSym1 d :: TyFun [a] [a] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing (IntersperseSym1 d) #

(SEq a, SingI d) => SingI (IntersectSym1 d :: TyFun [a] [a] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing (IntersectSym1 d) #

SingI d => SingI (IntersectBySym1 d :: TyFun [a] ([a] ~> [a]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing (IntersectBySym1 d) #

(SOrd a, SingI d) => SingI (InsertSym1 d :: TyFun [a] [a] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing (InsertSym1 d) #

SingI d => SingI (GroupBySym1 d :: TyFun [a] [[a]] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing (GroupBySym1 d) #

SNum i => SingI (GenericLengthSym0 :: TyFun [a] i -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing GenericLengthSym0 #

SingI d => SingI (Foldr1Sym1 d :: TyFun [a] a -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing (Foldr1Sym1 d) #

SingI d => SingI (Foldl1Sym1 d :: TyFun [a] a -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing (Foldl1Sym1 d) #

SingI d => SingI (Foldl1'Sym1 d :: TyFun [a] a -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing (Foldl1'Sym1 d) #

SingI d => SingI (FindSym1 d :: TyFun [a] (Maybe a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing (FindSym1 d) #

SingI d => SingI (FindIndicesSym1 d :: TyFun [a] [Nat] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing (FindIndicesSym1 d) #

SingI d => SingI (FindIndexSym1 d :: TyFun [a] (Maybe Nat) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing (FindIndexSym1 d) #

SingI d => SingI (FilterSym1 d :: TyFun [a] [a] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing (FilterSym1 d) #

(SEq a, SingI d) => SingI (ElemSym1 d :: TyFun [a] Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing (ElemSym1 d) #

(SEq a, SingI d) => SingI (ElemIndicesSym1 d :: TyFun [a] [Nat] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing (ElemIndicesSym1 d) #

(SEq a, SingI d) => SingI (ElemIndexSym1 d :: TyFun [a] (Maybe Nat) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing (ElemIndexSym1 d) #

SingI d => SingI (DropWhileSym1 d :: TyFun [a] [a] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing (DropWhileSym1 d) #

SingI d => SingI (DropWhileEndSym1 d :: TyFun [a] [a] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing (DropWhileEndSym1 d) #

SingI d => SingI (DropSym1 d :: TyFun [a] [a] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing (DropSym1 d) #

(SEq a, SingI d) => SingI (DeleteSym1 d :: TyFun [a] [a] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing (DeleteSym1 d) #

SingI d => SingI (DeleteFirstsBySym1 d :: TyFun [a] ([a] ~> [a]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing (DeleteFirstsBySym1 d) #

SingI d => SingI (BreakSym1 d :: TyFun [a] ([a], [a]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing (BreakSym1 d) #

SingI d => SingI (AnySym1 d :: TyFun [a] Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing (AnySym1 d) #

SingI d => SingI (AllSym1 d :: TyFun [a] Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing (AllSym1 d) #

SingI d => SingI (ShowListWithSym1 d :: TyFun [a] (Symbol ~> Symbol) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

Methods

sing :: Sing (ShowListWithSym1 d) #

SingI d => SingI ((++@#@$$) d :: TyFun [a] [a] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Base

Methods

sing :: Sing ((++@#@$$) d) #

SingI d => SingI ((:|@#@$$) d :: TyFun [a] (NonEmpty a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Instances

Methods

sing :: Sing ((:|@#@$$) d) #

SingI d => SingI ((:@#@$$) d :: TyFun [a] [a] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Instances

Methods

sing :: Sing ((:@#@$$) d) #

SingI d => SingI (FromMaybeSym1 d :: TyFun (Maybe a) a -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Maybe

Methods

sing :: Sing (FromMaybeSym1 d) #

SingI (IsRightSym0 :: TyFun (Either a b) Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Either

Methods

sing :: Sing IsRightSym0 #

SingI (IsLeftSym0 :: TyFun (Either a b) Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Either

Methods

sing :: Sing IsLeftSym0 #

(SingI d1, SingI d2) => SingI (EfdtNatDnSym2 d1 d2 :: TyFun Nat [Nat] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Enum

Methods

sing :: Sing (EfdtNatDnSym2 d1 d2) #

(SingI d1, SingI d2) => SingI (EfdtNatSym2 d1 d2 :: TyFun Nat [Nat] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Enum

Methods

sing :: Sing (EfdtNatSym2 d1 d2) #

(SingI d1, SingI d2) => SingI (EfdtNatUpSym2 d1 d2 :: TyFun Nat [Nat] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Enum

Methods

sing :: Sing (EfdtNatUpSym2 d1 d2) #

SingI d => SingI (ListindexSym1 d :: TyFun Nat a -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

Methods

sing :: Sing (ListindexSym1 d) #

SingI d => SingI ((!!@#@$$) d :: TyFun Nat a -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing ((!!@#@$$) d) #

SApplicative m => SingI (ReplicateM_Sym0 :: TyFun Nat (m a ~> m ()) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad

Methods

sing :: Sing ReplicateM_Sym0 #

SApplicative m => SingI (ReplicateMSym0 :: TyFun Nat (m a ~> m [a]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad

Methods

sing :: Sing ReplicateMSym0 #

(SShow a, SingI d) => SingI (ShowListSym1 d :: TyFun Symbol Symbol -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

Methods

sing :: Sing (ShowListSym1 d) #

(SingI d1, SingI d2) => SingI (ShowParenSym2 d1 d2 :: TyFun Symbol Symbol -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

Methods

sing :: Sing (ShowParenSym2 d1 d2) #

(SShow a, SingI d) => SingI (ShowsSym1 d :: TyFun Symbol Symbol -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

Methods

sing :: Sing (ShowsSym1 d) #

SingI (ErrorWithoutStackTraceSym0 :: TyFun Symbol a -> Type) 
Instance details

Defined in Data.Singletons.TypeLits.Internal

Methods

sing :: Sing ErrorWithoutStackTraceSym0 #

SingI (ErrorSym0 :: TyFun Symbol a -> Type) 
Instance details

Defined in Data.Singletons.TypeLits.Internal

Methods

sing :: Sing ErrorSym0 #

SingI (SwapSym0 :: TyFun (a, b) (b, a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Tuple

Methods

sing :: Sing SwapSym0 #

SingI (SndSym0 :: TyFun (a, b) b -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Tuple

Methods

sing :: Sing SndSym0 #

SingI (FstSym0 :: TyFun (a, b) a -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Tuple

Methods

sing :: Sing FstSym0 #

(SOrd a, SingI d) => SingI (Min_Sym1 d :: TyFun a a -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord.Disambiguation

Methods

sing :: Sing (Min_Sym1 d) #

(SOrd a, SingI d) => SingI (Max_Sym1 d :: TyFun a a -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord.Disambiguation

Methods

sing :: Sing (Max_Sym1 d) #

SingI (Maybe_Sym0 :: TyFun b ((a ~> b) ~> (Maybe a ~> b)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Maybe

Methods

sing :: Sing Maybe_Sym0 #

SingI d => SingI (SelectSym1 d :: TyFun a (([a], [a]) ~> ([a], [a])) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing (SelectSym1 d) #

SingI d => SingI (ReplicateSym1 d :: TyFun a [a] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing (ReplicateSym1 d) #

SEq a => SingI (LookupSym0 :: TyFun a ([(a, b)] ~> Maybe b) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing LookupSym0 #

SingI d => SingI (InsertBySym1 d :: TyFun a ([a] ~> [a]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing (InsertBySym1 d) #

SingI d => SingI (Elem_bySym1 d :: TyFun a ([a] ~> Bool) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing (Elem_bySym1 d) #

SingI d => SingI (DeleteBySym1 d :: TyFun a ([a] ~> [a]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing (DeleteBySym1 d) #

(SShow a, SingI d) => SingI (ShowsPrecSym1 d :: TyFun a (Symbol ~> Symbol) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

Methods

sing :: Sing (ShowsPrecSym1 d) #

(SEnum a, SingI d) => SingI (EnumFromToSym1 d :: TyFun a [a] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Enum

Methods

sing :: Sing (EnumFromToSym1 d) #

(SEnum a, SingI d) => SingI (EnumFromThenToSym1 d :: TyFun a (a ~> [a]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Enum

Methods

sing :: Sing (EnumFromThenToSym1 d) #

SFoldable t => SingI (ToListSym0 :: TyFun (t a) [a] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

Methods

sing :: Sing ToListSym0 #

(SFoldable t, SNum a) => SingI (SumSym0 :: TyFun (t a) a -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

Methods

sing :: Sing SumSym0 #

(SFoldable t, SNum a) => SingI (ProductSym0 :: TyFun (t a) a -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

Methods

sing :: Sing ProductSym0 #

(SFoldable t, SEq a) => SingI (NotElemSym0 :: TyFun a (t a ~> Bool) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

Methods

sing :: Sing NotElemSym0 #

(SFoldable t, SOrd a) => SingI (MinimumSym0 :: TyFun (t a) a -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

Methods

sing :: Sing MinimumSym0 #

(SFoldable t, SOrd a) => SingI (MaximumSym0 :: TyFun (t a) a -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

Methods

sing :: Sing MaximumSym0 #

(SFoldable t, SMonoid m) => SingI (FoldSym0 :: TyFun (t m) m -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

Methods

sing :: Sing FoldSym0 #

(SFoldable t, SEq a) => SingI (ElemSym0 :: TyFun a (t a ~> Bool) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

Methods

sing :: Sing ElemSym0 #

SFoldable t => SingI (ConcatSym0 :: TyFun (t [a]) [a] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

Methods

sing :: Sing ConcatSym0 #

SingI d => SingI (AppEndoSym1 d :: TyFun a a -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

Methods

sing :: Sing (AppEndoSym1 d) #

(SEq a, SingI x) => SingI ((==@#@$$) x :: TyFun a Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Eq

Methods

sing :: Sing ((==@#@$$) x) #

(SEq a, SingI x) => SingI ((/=@#@$$) x :: TyFun a Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Eq

Methods

sing :: Sing ((/=@#@$$) x) #

(SNum a, SingI d) => SingI (SubtractSym1 d :: TyFun a a -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Num

Methods

sing :: Sing (SubtractSym1 d) #

(SNum a, SingI d) => SingI ((-@#@$$) d :: TyFun a a -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Num

Methods

sing :: Sing ((-@#@$$) d) #

(SNum a, SingI d) => SingI ((+@#@$$) d :: TyFun a a -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Num

Methods

sing :: Sing ((+@#@$$) d) #

(SNum a, SingI d) => SingI ((*@#@$$) d :: TyFun a a -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Num

Methods

sing :: Sing ((*@#@$$) d) #

SingI d => SingI (Bool_Sym1 d :: TyFun a (Bool ~> a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Bool

Methods

sing :: Sing (Bool_Sym1 d) #

SingI (SeqSym0 :: TyFun a (b ~> b) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Base

Methods

sing :: Sing SeqSym0 #

SingI (ConstSym0 :: TyFun a (b ~> a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Base

Methods

sing :: Sing ConstSym0 #

SingI d => SingI (AsTypeOfSym1 d :: TyFun a a -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Base

Methods

sing :: Sing (AsTypeOfSym1 d) #

(SApplicative f, SingI d) => SingI (WhenSym1 d :: TyFun (f ()) (f ()) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

Methods

sing :: Sing (WhenSym1 d) #

SMonad m => SingI (ReturnSym0 :: TyFun a (m a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

Methods

sing :: Sing ReturnSym0 #

SApplicative f => SingI (PureSym0 :: TyFun a (f a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

Methods

sing :: Sing PureSym0 #

SMonad m => SingI (JoinSym0 :: TyFun (m (m a)) (m a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

Methods

sing :: Sing JoinSym0 #

SingI (Tuple2Sym0 :: TyFun a (b ~> (a, b)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Instances

Methods

sing :: Sing Tuple2Sym0 #

SingI (RightSym0 :: TyFun b (Either a b) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Instances

Methods

sing :: Sing RightSym0 #

SingI (LeftSym0 :: TyFun a (Either a b) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Instances

Methods

sing :: Sing LeftSym0 #

(SOrd a, SingI d) => SingI (MinSym1 d :: TyFun a a -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

Methods

sing :: Sing (MinSym1 d) #

(SOrd a, SingI d) => SingI (MaxSym1 d :: TyFun a a -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

Methods

sing :: Sing (MaxSym1 d) #

(SOrd a, SingI d) => SingI (CompareSym1 d :: TyFun a Ordering -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

Methods

sing :: Sing (CompareSym1 d) #

(SOrd a, SingI d) => SingI ((>@#@$$) d :: TyFun a Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

Methods

sing :: Sing ((>@#@$$) d) #

(SOrd a, SingI d) => SingI ((>=@#@$$) d :: TyFun a Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

Methods

sing :: Sing ((>=@#@$$) d) #

(SOrd a, SingI d) => SingI ((<@#@$$) d :: TyFun a Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

Methods

sing :: Sing ((<@#@$$) d) #

(SOrd a, SingI d) => SingI ((<=@#@$$) d :: TyFun a Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

Methods

sing :: Sing ((<=@#@$$) d) #

(SSemigroup a, SingI d) => SingI ((<>@#@$$) d :: TyFun a a -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

Methods

sing :: Sing ((<>@#@$$) d) #

(SMonoid a, SingI d) => SingI (MappendSym1 d :: TyFun a a -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

Methods

sing :: Sing (MappendSym1 d) #

SingI (AsProxyTypeOfSym0 :: TyFun a (proxy a ~> a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Proxy

Methods

sing :: Sing AsProxyTypeOfSym0 #

SFunctor f => SingI (VoidSym0 :: TyFun (f a) (f ()) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Functor

Methods

sing :: Sing VoidSym0 #

SingI (Option_Sym0 :: TyFun b ((a ~> b) ~> (Option a ~> b)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

Methods

sing :: Sing Option_Sym0 #

SingI (ArgSym0 :: TyFun a (b ~> Arg a b) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

Methods

sing :: Sing ArgSym0 #

SAlternative f => SingI (OptionalSym0 :: TyFun (f a) (f (Maybe a)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Applicative

Methods

sing :: Sing OptionalSym0 #

(SApplicative f, SingI d) => SingI (UnlessSym1 d :: TyFun (f ()) (f ()) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad

Methods

sing :: Sing (UnlessSym1 d) #

SingI (MapMaybeSym0 :: TyFun (a ~> Maybe b) ([a] ~> [b]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Maybe

Methods

sing :: Sing MapMaybeSym0 #

SingI (ListscanrSym0 :: TyFun (a ~> (b ~> b)) (b ~> ([a] ~> [b])) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

Methods

sing :: Sing ListscanrSym0 #

SingI (ListscanlSym0 :: TyFun (b ~> (a ~> b)) (b ~> ([a] ~> [b])) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

Methods

sing :: Sing ListscanlSym0 #

SingI (ListmapSym0 :: TyFun (a ~> b) ([a] ~> [b]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

Methods

sing :: Sing ListmapSym0 #

SingI (ListfoldrSym0 :: TyFun (a ~> (b ~> b)) (b ~> ([a] ~> b)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

Methods

sing :: Sing ListfoldrSym0 #

SingI (ListfoldlSym0 :: TyFun (b ~> (a ~> b)) (b ~> ([a] ~> b)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

Methods

sing :: Sing ListfoldlSym0 #

SingI (Listfoldl'Sym0 :: TyFun (b ~> (a ~> b)) (b ~> ([a] ~> b)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

Methods

sing :: Sing Listfoldl'Sym0 #

SingI (UnfoldrSym0 :: TyFun (b ~> Maybe (a, b)) (b ~> [a]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing UnfoldrSym0 #

SingI (ScanrSym0 :: TyFun (a ~> (b ~> b)) (b ~> ([a] ~> [b])) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing ScanrSym0 #

SingI (ScanlSym0 :: TyFun (b ~> (a ~> b)) (b ~> ([a] ~> [b])) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing ScanlSym0 #

SingI (Foldl'Sym0 :: TyFun (b ~> (a ~> b)) (b ~> ([a] ~> b)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing Foldl'Sym0 #

SingI (ConcatMapSym0 :: TyFun (a ~> [b]) ([a] ~> [b]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing ConcatMapSym0 #

SFoldable t => SingI (MinimumBySym0 :: TyFun (a ~> (a ~> Ordering)) (t a ~> a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

Methods

sing :: Sing MinimumBySym0 #

SFoldable t => SingI (MaximumBySym0 :: TyFun (a ~> (a ~> Ordering)) (t a ~> a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

Methods

sing :: Sing MaximumBySym0 #

SFoldable t => SingI (Foldr1Sym0 :: TyFun (a ~> (a ~> a)) (t a ~> a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

Methods

sing :: Sing Foldr1Sym0 #

SFoldable t => SingI (Foldl1Sym0 :: TyFun (a ~> (a ~> a)) (t a ~> a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

Methods

sing :: Sing Foldl1Sym0 #

SFoldable t => SingI (FindSym0 :: TyFun (a ~> Bool) (t a ~> Maybe a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

Methods

sing :: Sing FindSym0 #

SFoldable t => SingI (AnySym0 :: TyFun (a ~> Bool) (t a ~> Bool) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

Methods

sing :: Sing AnySym0 #

SFoldable t => SingI (AllSym0 :: TyFun (a ~> Bool) (t a ~> Bool) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

Methods

sing :: Sing AllSym0 #

SingI d => SingI (UntilSym1 d :: TyFun (a ~> a) (a ~> a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Base

Methods

sing :: Sing (UntilSym1 d) #

SingI (MapSym0 :: TyFun (a ~> b) ([a] ~> [b]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Base

Methods

sing :: Sing MapSym0 #

SingI (FoldrSym0 :: TyFun (a ~> (b ~> b)) (b ~> ([a] ~> b)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Base

Methods

sing :: Sing FoldrSym0 #

SingI (($@#@$) :: TyFun (a ~> b) (a ~> b) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Base

Methods

sing :: Sing ($@#@$) #

SingI (($!@#@$) :: TyFun (a ~> b) (a ~> b) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Base

Methods

sing :: Sing ($!@#@$) #

SingI (FoldlSym0 :: TyFun (b ~> (a ~> b)) (b ~> ([a] ~> b)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Instances

Methods

sing :: Sing FoldlSym0 #

SOrd a => SingI (ComparingSym0 :: TyFun (b ~> a) (b ~> (b ~> Ordering)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

Methods

sing :: Sing ComparingSym0 #

SMonadPlus m => SingI (MfilterSym0 :: TyFun (a ~> Bool) (m a ~> m a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad

Methods

sing :: Sing MfilterSym0 #

SApplicative m => SingI (FilterMSym0 :: TyFun (a ~> m Bool) ([a] ~> m [a]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad

Methods

sing :: Sing FilterMSym0 #

SingI (RunStateLSym0 :: TyFun (StateL s a) (s ~> (s, a)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

Methods

sing :: Sing RunStateLSym0 #

SingI (RunStateRSym0 :: TyFun (StateR s a) (s ~> (s, a)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

Methods

sing :: Sing RunStateRSym0 #

SingI (ConstSym0 :: TyFun a (Const a b) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Const

Methods

sing :: Sing ConstSym0 #

SingI a => SingI ('WrapSing s :: WrappedSing a) 
Instance details

Defined in Data.Singletons.Internal

Methods

sing :: Sing ('WrapSing s) #

(SingI d1, SingI d2) => SingI (Bool_Sym2 d1 d2 :: TyFun Bool a -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Bool

Methods

sing :: Sing (Bool_Sym2 d1 d2) #

SMonadFail m => SingI (FailSym0 :: TyFun [Char] (m a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Fail

Methods

sing :: Sing FailSym0 #

(SEq a, SingI d) => SingI (LookupSym1 d :: TyFun [(a, b)] (Maybe b) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing (LookupSym1 d) #

SingI (Unzip3Sym0 :: TyFun [(a, b, c)] ([a], [b], [c]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing Unzip3Sym0 #

SingI d => SingI (MapMaybeSym1 d :: TyFun [a] [b] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Maybe

Methods

sing :: Sing (MapMaybeSym1 d) #

SingI d => SingI (ListzipSym1 d :: TyFun [b] [(a, b)] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

Methods

sing :: Sing (ListzipSym1 d) #

SingI d => SingI (ListmapSym1 d :: TyFun [a] [b] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

Methods

sing :: Sing (ListmapSym1 d) #

SingI d => SingI (ZipSym1 d :: TyFun [b] [(a, b)] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing (ZipSym1 d) #

SingI (Zip3Sym0 :: TyFun [a] ([b] ~> ([c] ~> [(a, b, c)])) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing Zip3Sym0 #

(SingI d1, SingI d2) => SingI (UnionBySym2 d1 d2 :: TyFun [a] [a] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing (UnionBySym2 d1 d2) #

(SingI d1, SingI d2) => SingI (IntersectBySym2 d1 d2 :: TyFun [a] [a] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing (IntersectBySym2 d1 d2) #

(SingI d1, SingI d2) => SingI (InsertBySym2 d1 d2 :: TyFun [a] [a] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing (InsertBySym2 d1 d2) #

(SingI d1, SingI d2) => SingI (Elem_bySym2 d1 d2 :: TyFun [a] Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing (Elem_bySym2 d1 d2) #

(SingI d1, SingI d2) => SingI (DeleteFirstsBySym2 d1 d2 :: TyFun [a] [a] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing (DeleteFirstsBySym2 d1 d2) #

(SingI d1, SingI d2) => SingI (DeleteBySym2 d1 d2 :: TyFun [a] [a] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing (DeleteBySym2 d1 d2) #

SingI d => SingI (ConcatMapSym1 d :: TyFun [a] [b] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing (ConcatMapSym1 d) #

SingI d => SingI (MapSym1 d :: TyFun [a] [b] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Base

Methods

sing :: Sing (MapSym1 d) #

(SApplicative m, SingI d) => SingI (FilterMSym1 d :: TyFun [a] (m [a]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad

Methods

sing :: Sing (FilterMSym1 d) #

(SShow a, SingI d1, SingI d2) => SingI (ShowsPrecSym2 d1 d2 :: TyFun Symbol Symbol -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

Methods

sing :: Sing (ShowsPrecSym2 d1 d2) #

(SingI d1, SingI d2) => SingI (ShowListWithSym2 d1 d2 :: TyFun Symbol Symbol -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

Methods

sing :: Sing (ShowListWithSym2 d1 d2) #

(SingI d1, SingI d2) => SingI (SelectSym2 d1 d2 :: TyFun ([a], [a]) ([a], [a]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing (SelectSym2 d1 d2) #

(STraversable t, SMonad m) => SingI (SequenceSym0 :: TyFun (t (m a)) (m (t a)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

Methods

sing :: Sing SequenceSym0 #

(STraversable t, SApplicative f) => SingI (SequenceASym0 :: TyFun (t (f a)) (f (t a)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

Methods

sing :: Sing SequenceASym0 #

SingI d => SingI (RunStateRSym1 d :: TyFun s (s, a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

Methods

sing :: Sing (RunStateRSym1 d) #

SingI d => SingI (RunStateLSym1 d :: TyFun s (s, a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

Methods

sing :: Sing (RunStateLSym1 d) #

SingI d => SingI (ListscanrSym1 d :: TyFun b ([a] ~> [b]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

Methods

sing :: Sing (ListscanrSym1 d) #

SingI d => SingI (ListscanlSym1 d :: TyFun b ([a] ~> [b]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

Methods

sing :: Sing (ListscanlSym1 d) #

SingI d => SingI (ListfoldrSym1 d :: TyFun b ([a] ~> b) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

Methods

sing :: Sing (ListfoldrSym1 d) #

SingI d => SingI (ListfoldlSym1 d :: TyFun b ([a] ~> b) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

Methods

sing :: Sing (ListfoldlSym1 d) #

SingI d => SingI (Listfoldl'Sym1 d :: TyFun b ([a] ~> b) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

Methods

sing :: Sing (Listfoldl'Sym1 d) #

SingI d => SingI (UnfoldrSym1 d :: TyFun b [a] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing (UnfoldrSym1 d) #

SingI d => SingI (ScanrSym1 d :: TyFun b ([a] ~> [b]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing (ScanrSym1 d) #

SingI d => SingI (ScanlSym1 d :: TyFun b ([a] ~> [b]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing (ScanlSym1 d) #

SingI d => SingI (Foldl'Sym1 d :: TyFun b ([a] ~> b) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing (Foldl'Sym1 d) #

(SEnum a, SingI d1, SingI d2) => SingI (EnumFromThenToSym2 d1 d2 :: TyFun a [a] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Enum

Methods

sing :: Sing (EnumFromThenToSym2 d1 d2) #

(SFoldable t, SMonad m) => SingI (Sequence_Sym0 :: TyFun (t (m a)) (m ()) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

Methods

sing :: Sing Sequence_Sym0 #

(SFoldable t, SApplicative f) => SingI (SequenceA_Sym0 :: TyFun (t (f a)) (f ()) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

Methods

sing :: Sing SequenceA_Sym0 #

SFoldable t => SingI (NullSym0 :: TyFun (t a) Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

Methods

sing :: Sing NullSym0 #

(SFoldable t, SEq a, SingI d) => SingI (NotElemSym1 d :: TyFun (t a) Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

Methods

sing :: Sing (NotElemSym1 d) #

(SFoldable t, SingI d) => SingI (MinimumBySym1 d :: TyFun (t a) a -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

Methods

sing :: Sing (MinimumBySym1 d) #

(SFoldable t, SingI d) => SingI (MaximumBySym1 d :: TyFun (t a) a -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

Methods

sing :: Sing (MaximumBySym1 d) #

SFoldable t => SingI (LengthSym0 :: TyFun (t a) Nat -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

Methods

sing :: Sing LengthSym0 #

(SFoldable t, SingI d) => SingI (Foldr1Sym1 d :: TyFun (t a) a -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

Methods

sing :: Sing (Foldr1Sym1 d) #

(SFoldable t, SingI d) => SingI (Foldl1Sym1 d :: TyFun (t a) a -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

Methods

sing :: Sing (Foldl1Sym1 d) #

(SFoldable t, SingI d) => SingI (FindSym1 d :: TyFun (t a) (Maybe a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

Methods

sing :: Sing (FindSym1 d) #

(SFoldable t, SEq a, SingI d) => SingI (ElemSym1 d :: TyFun (t a) Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

Methods

sing :: Sing (ElemSym1 d) #

(SFoldable t, SingI d) => SingI (AnySym1 d :: TyFun (t a) Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

Methods

sing :: Sing (AnySym1 d) #

(SFoldable t, SingI d) => SingI (AllSym1 d :: TyFun (t a) Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

Methods

sing :: Sing (AllSym1 d) #

(SingI d1, SingI d2) => SingI (UntilSym2 d1 d2 :: TyFun a a -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Base

Methods

sing :: Sing (UntilSym2 d1 d2) #

SingI d => SingI (SeqSym1 d :: TyFun b b -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Base

Methods

sing :: Sing (SeqSym1 d) #

SingI d => SingI (FoldrSym1 d :: TyFun b ([a] ~> b) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Base

Methods

sing :: Sing (FoldrSym1 d) #

SingI d => SingI (ConstSym1 d :: TyFun b a -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Base

Methods

sing :: Sing (ConstSym1 d) #

SingI d => SingI (($@#@$$) d :: TyFun a b -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Base

Methods

sing :: Sing (($@#@$$) d) #

SingI d => SingI (($!@#@$$) d :: TyFun a b -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Base

Methods

sing :: Sing (($!@#@$$) d) #

SMonadPlus m => SingI (MplusSym0 :: TyFun (m a) (m a ~> m a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

Methods

sing :: Sing MplusSym0 #

SMonad m => SingI (ApSym0 :: TyFun (m (a ~> b)) (m a ~> m b) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

Methods

sing :: Sing ApSym0 #

SMonad m => SingI ((>>=@#@$) :: TyFun (m a) ((a ~> m b) ~> m b) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

Methods

sing :: Sing (>>=@#@$) #

SAlternative f => SingI ((<|>@#@$) :: TyFun (f a) (f a ~> f a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

Methods

sing :: Sing (<|>@#@$) #

SApplicative f => SingI ((<*>@#@$) :: TyFun (f (a ~> b)) (f a ~> f b) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

Methods

sing :: Sing (<*>@#@$) #

SApplicative f => SingI ((<**>@#@$) :: TyFun (f a) (f (a ~> b) ~> f b) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

Methods

sing :: Sing (<**>@#@$) #

SFunctor f => SingI ((<$@#@$) :: TyFun a (f b ~> f a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

Methods

sing :: Sing (<$@#@$) #

SingI (Tuple3Sym0 :: TyFun a (b ~> (c ~> (a, b, c))) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Instances

Methods

sing :: Sing Tuple3Sym0 #

SingI d => SingI (Tuple2Sym1 d :: TyFun b (a, b) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Instances

Methods

sing :: Sing (Tuple2Sym1 d) #

SingI d => SingI (FoldlSym1 d :: TyFun b ([a] ~> b) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Instances

Methods

sing :: Sing (FoldlSym1 d) #

(SOrd a, SingI d) => SingI (ComparingSym1 d :: TyFun b (b ~> Ordering) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

Methods

sing :: Sing (ComparingSym1 d) #

SingI d => SingI (AsProxyTypeOfSym1 d :: TyFun (proxy a) a -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Proxy

Methods

sing :: Sing (AsProxyTypeOfSym1 d) #

SFunctor f => SingI ((<&>@#@$) :: TyFun (f a) ((a ~> b) ~> f b) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Functor

Methods

sing :: Sing (<&>@#@$) #

SFunctor f => SingI (($>@#@$) :: TyFun (f a) (b ~> f b) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Functor

Methods

sing :: Sing ($>@#@$) #

SingI d => SingI (ArgSym1 d :: TyFun b (Arg a b) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

Methods

sing :: Sing (ArgSym1 d) #

(SApplicative m, SingI d) => SingI (ReplicateM_Sym1 d :: TyFun (m a) (m ()) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad

Methods

sing :: Sing (ReplicateM_Sym1 d) #

(SApplicative m, SingI d) => SingI (ReplicateMSym1 d :: TyFun (m a) (m [a]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad

Methods

sing :: Sing (ReplicateMSym1 d) #

(SMonadPlus m, SingI d) => SingI (MfilterSym1 d :: TyFun (m a) (m a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad

Methods

sing :: Sing (MfilterSym1 d) #

SingI (GetConstSym0 :: TyFun (Const a b) a -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Const

Methods

sing :: Sing GetConstSym0 #

SingI (CurrySym0 :: TyFun ((a, b) ~> c) (a ~> (b ~> c)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Tuple

Methods

sing :: Sing CurrySym0 #

SingI (UncurrySym0 :: TyFun (a ~> (b ~> c)) ((a, b) ~> c) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Tuple

Methods

sing :: Sing UncurrySym0 #

(STraversable t, SMonoid m) => SingI (FoldMapDefaultSym0 :: TyFun (a ~> m) (t a ~> m) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

Methods

sing :: Sing FoldMapDefaultSym0 #

STraversable t => SingI (FmapDefaultSym0 :: TyFun (a ~> b) (t a ~> t b) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

Methods

sing :: Sing FmapDefaultSym0 #

SingI d => SingI (Maybe_Sym1 d :: TyFun (a ~> b) (Maybe a ~> b) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Maybe

Methods

sing :: Sing (Maybe_Sym1 d) #

SingI (ListzipWithSym0 :: TyFun (a ~> (b ~> c)) ([a] ~> ([b] ~> [c])) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

Methods

sing :: Sing ListzipWithSym0 #

SingI (ZipWithSym0 :: TyFun (a ~> (b ~> c)) ([a] ~> ([b] ~> [c])) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing ZipWithSym0 #

SingI (MapAccumRSym0 :: TyFun (acc ~> (x ~> (acc, y))) (acc ~> ([x] ~> (acc, [y]))) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing MapAccumRSym0 #

SingI (MapAccumLSym0 :: TyFun (acc ~> (x ~> (acc, y))) (acc ~> ([x] ~> (acc, [y]))) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing MapAccumLSym0 #

SingI (Either_Sym0 :: TyFun (a ~> c) ((b ~> c) ~> (Either a b ~> c)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Either

Methods

sing :: Sing Either_Sym0 #

SFoldable t => SingI (FoldrSym0 :: TyFun (a ~> (b ~> b)) (b ~> (t a ~> b)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

Methods

sing :: Sing FoldrSym0 #

SFoldable t => SingI (Foldr'Sym0 :: TyFun (a ~> (b ~> b)) (b ~> (t a ~> b)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

Methods

sing :: Sing Foldr'Sym0 #

SFoldable t => SingI (FoldlSym0 :: TyFun (b ~> (a ~> b)) (b ~> (t a ~> b)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

Methods

sing :: Sing FoldlSym0 #

SFoldable t => SingI (Foldl'Sym0 :: TyFun (b ~> (a ~> b)) (b ~> (t a ~> b)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

Methods

sing :: Sing Foldl'Sym0 #

(SFoldable t, SMonoid m) => SingI (FoldMapSym0 :: TyFun (a ~> m) (t a ~> m) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

Methods

sing :: Sing FoldMapSym0 #

SFoldable t => SingI (ConcatMapSym0 :: TyFun (a ~> [b]) (t a ~> [b]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

Methods

sing :: Sing ConcatMapSym0 #

SingI (FlipSym0 :: TyFun (a ~> (b ~> c)) (b ~> (a ~> c)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Base

Methods

sing :: Sing FlipSym0 #

SingI ((.@#@$) :: TyFun (b ~> c) ((a ~> b) ~> (a ~> c)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Base

Methods

sing :: Sing (.@#@$) #

SMonad m => SingI (LiftMSym0 :: TyFun (a1 ~> r) (m a1 ~> m r) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

Methods

sing :: Sing LiftMSym0 #

SApplicative f => SingI (LiftASym0 :: TyFun (a ~> b) (f a ~> f b) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

Methods

sing :: Sing LiftASym0 #

SFunctor f => SingI (FmapSym0 :: TyFun (a ~> b) (f a ~> f b) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

Methods

sing :: Sing FmapSym0 #

SMonad m => SingI ((=<<@#@$) :: TyFun (a ~> m b) (m a ~> m b) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

Methods

sing :: Sing (=<<@#@$) #

SFunctor f => SingI ((<$>@#@$) :: TyFun (a ~> b) (f a ~> f b) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Functor

Methods

sing :: Sing (<$>@#@$) #

SingI d => SingI (Option_Sym1 d :: TyFun (a ~> b) (Option a ~> b) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

Methods

sing :: Sing (Option_Sym1 d) #

SMonad m => SingI ((<$!>@#@$) :: TyFun (a ~> b) (m a ~> m b) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad

Methods

sing :: Sing (<$!>@#@$) #

SingI (Unzip4Sym0 :: TyFun [(a, b, c, d)] ([a], [b], [c], [d]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing Unzip4Sym0 #

SingI d => SingI (ListzipWithSym1 d :: TyFun [a] ([b] ~> [c]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

Methods

sing :: Sing (ListzipWithSym1 d) #

(SingI d1, SingI d2) => SingI (ListscanrSym2 d1 d2 :: TyFun [a] [b] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

Methods

sing :: Sing (ListscanrSym2 d1 d2) #

(SingI d1, SingI d2) => SingI (ListscanlSym2 d1 d2 :: TyFun [a] [b] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

Methods

sing :: Sing (ListscanlSym2 d1 d2) #

(SingI d1, SingI d2) => SingI (ListfoldrSym2 d1 d2 :: TyFun [a] b -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

Methods

sing :: Sing (ListfoldrSym2 d1 d2) #

(SingI d1, SingI d2) => SingI (ListfoldlSym2 d1 d2 :: TyFun [a] b -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

Methods

sing :: Sing (ListfoldlSym2 d1 d2) #

(SingI d1, SingI d2) => SingI (Listfoldl'Sym2 d1 d2 :: TyFun [a] b -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

Methods

sing :: Sing (Listfoldl'Sym2 d1 d2) #

SingI d => SingI (ZipWithSym1 d :: TyFun [a] ([b] ~> [c]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing (ZipWithSym1 d) #

SingI d => SingI (Zip3Sym1 d :: TyFun [b] ([c] ~> [(a, b, c)]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing (Zip3Sym1 d) #

(SingI d1, SingI d2) => SingI (ScanrSym2 d1 d2 :: TyFun [a] [b] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing (ScanrSym2 d1 d2) #

(SingI d1, SingI d2) => SingI (ScanlSym2 d1 d2 :: TyFun [a] [b] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing (ScanlSym2 d1 d2) #

(SingI d1, SingI d2) => SingI (Foldl'Sym2 d1 d2 :: TyFun [a] b -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing (Foldl'Sym2 d1 d2) #

(SingI d1, SingI d2) => SingI (FoldrSym2 d1 d2 :: TyFun [a] b -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Base

Methods

sing :: Sing (FoldrSym2 d1 d2) #

(SingI d1, SingI d2) => SingI (FoldlSym2 d1 d2 :: TyFun [a] b -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Instances

Methods

sing :: Sing (FoldlSym2 d1 d2) #

(SingI d1, SingI d2) => SingI (Maybe_Sym2 d1 d2 :: TyFun (Maybe a) b -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Maybe

Methods

sing :: Sing (Maybe_Sym2 d1 d2) #

SingI d => SingI (UncurrySym1 d :: TyFun (a, b) c -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Tuple

Methods

sing :: Sing (UncurrySym1 d) #

SingI d => SingI (CurrySym1 d :: TyFun a (b ~> c) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Tuple

Methods

sing :: Sing (CurrySym1 d) #

(STraversable t, SApplicative f) => SingI (ForSym0 :: TyFun (t a) ((a ~> f b) ~> f (t b)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

Methods

sing :: Sing ForSym0 #

(STraversable t, SMonad m) => SingI (ForMSym0 :: TyFun (t a) ((a ~> m b) ~> m (t b)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

Methods

sing :: Sing ForMSym0 #

(STraversable t, SMonoid m, SingI d) => SingI (FoldMapDefaultSym1 d :: TyFun (t a) m -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

Methods

sing :: Sing (FoldMapDefaultSym1 d) #

(STraversable t, SingI d) => SingI (FmapDefaultSym1 d :: TyFun (t a) (t b) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

Methods

sing :: Sing (FmapDefaultSym1 d) #

SingI d => SingI (MapAccumRSym1 d :: TyFun acc ([x] ~> (acc, [y])) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing (MapAccumRSym1 d) #

SingI d => SingI (MapAccumLSym1 d :: TyFun acc ([x] ~> (acc, [y])) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing (MapAccumLSym1 d) #

(SFoldable t, SMonadPlus m) => SingI (MsumSym0 :: TyFun (t (m a)) (m a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

Methods

sing :: Sing MsumSym0 #

(SFoldable t, SApplicative f) => SingI (For_Sym0 :: TyFun (t a) ((a ~> f b) ~> f ()) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

Methods

sing :: Sing For_Sym0 #

(SFoldable t, SMonad m) => SingI (ForM_Sym0 :: TyFun (t a) ((a ~> m b) ~> m ()) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

Methods

sing :: Sing ForM_Sym0 #

(SFoldable t, SingI d) => SingI (FoldrSym1 d :: TyFun b (t a ~> b) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

Methods

sing :: Sing (FoldrSym1 d) #

(SFoldable t, SingI d) => SingI (Foldr'Sym1 d :: TyFun b (t a ~> b) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

Methods

sing :: Sing (Foldr'Sym1 d) #

(SFoldable t, SingI d) => SingI (FoldlSym1 d :: TyFun b (t a ~> b) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

Methods

sing :: Sing (FoldlSym1 d) #

(SFoldable t, SingI d) => SingI (Foldl'Sym1 d :: TyFun b (t a ~> b) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

Methods

sing :: Sing (Foldl'Sym1 d) #

(SFoldable t, SMonoid m, SingI d) => SingI (FoldMapSym1 d :: TyFun (t a) m -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

Methods

sing :: Sing (FoldMapSym1 d) #

(SFoldable t, SingI d) => SingI (ConcatMapSym1 d :: TyFun (t a) [b] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

Methods

sing :: Sing (ConcatMapSym1 d) #

(SFoldable t, SAlternative f) => SingI (AsumSym0 :: TyFun (t (f a)) (f a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

Methods

sing :: Sing AsumSym0 #

SingI d => SingI (FlipSym1 d :: TyFun b (a ~> c) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Base

Methods

sing :: Sing (FlipSym1 d) #

(SMonadPlus m, SingI d) => SingI (MplusSym1 d :: TyFun (m a) (m a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

Methods

sing :: Sing (MplusSym1 d) #

(SMonad m, SingI d) => SingI (LiftMSym1 d :: TyFun (m a1) (m r) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

Methods

sing :: Sing (LiftMSym1 d) #

(SApplicative f, SingI d) => SingI (LiftASym1 d :: TyFun (f a) (f b) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

Methods

sing :: Sing (LiftASym1 d) #

(SFunctor f, SingI d) => SingI (FmapSym1 d :: TyFun (f a) (f b) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

Methods

sing :: Sing (FmapSym1 d) #

(SMonad m, SingI d) => SingI (ApSym1 d :: TyFun (m a) (m b) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

Methods

sing :: Sing (ApSym1 d) #

SMonad m => SingI ((>>@#@$) :: TyFun (m a) (m b ~> m b) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

Methods

sing :: Sing (>>@#@$) #

(SMonad m, SingI d) => SingI ((=<<@#@$$) d :: TyFun (m a) (m b) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

Methods

sing :: Sing ((=<<@#@$$) d) #

(SAlternative f, SingI d) => SingI ((<|>@#@$$) d :: TyFun (f a) (f a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

Methods

sing :: Sing ((<|>@#@$$) d) #

SApplicative f => SingI ((<*@#@$) :: TyFun (f a) (f b ~> f a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

Methods

sing :: Sing (<*@#@$) #

(SApplicative f, SingI d) => SingI ((<*>@#@$$) d :: TyFun (f a) (f b) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

Methods

sing :: Sing ((<*>@#@$$) d) #

(SApplicative f, SingI d) => SingI ((<**>@#@$$) d :: TyFun (f (a ~> b)) (f b) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

Methods

sing :: Sing ((<**>@#@$$) d) #

(SFunctor f, SingI d) => SingI ((<$@#@$$) d :: TyFun (f b) (f a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

Methods

sing :: Sing ((<$@#@$$) d) #

SApplicative f => SingI ((*>@#@$) :: TyFun (f a) (f b ~> f b) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

Methods

sing :: Sing (*>@#@$) #

SingI (Tuple4Sym0 :: TyFun a (b ~> (c ~> (d ~> (a, b, c, d)))) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Instances

Methods

sing :: Sing Tuple4Sym0 #

SingI d => SingI (Tuple3Sym1 d :: TyFun b (c ~> (a, b, c)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Instances

Methods

sing :: Sing (Tuple3Sym1 d) #

(SOrd a, SingI d1, SingI d2) => SingI (ComparingSym2 d1 d2 :: TyFun b Ordering -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

Methods

sing :: Sing (ComparingSym2 d1 d2) #

(SFunctor f, SingI d) => SingI ((<$>@#@$$) d :: TyFun (f a) (f b) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Functor

Methods

sing :: Sing ((<$>@#@$$) d) #

(SFunctor f, SingI d) => SingI (($>@#@$$) d :: TyFun b (f b) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Functor

Methods

sing :: Sing (($>@#@$$) d) #

(SMonad m, SingI d) => SingI ((<$!>@#@$$) d :: TyFun (m a) (m b) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad

Methods

sing :: Sing ((<$!>@#@$$) d) #

(SingI d1, SingI d2) => SingI (Option_Sym2 d1 d2 :: TyFun (Option a) b -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

Methods

sing :: Sing (Option_Sym2 d1 d2) #

(STraversable t, SApplicative f) => SingI (TraverseSym0 :: TyFun (a ~> f b) (t a ~> f (t b)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

Methods

sing :: Sing TraverseSym0 #

(STraversable t, SMonad m) => SingI (MapMSym0 :: TyFun (a ~> m b) (t a ~> m (t b)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

Methods

sing :: Sing MapMSym0 #

STraversable t => SingI (MapAccumRSym0 :: TyFun (a ~> (b ~> (a, c))) (a ~> (t b ~> (a, t c))) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

Methods

sing :: Sing MapAccumRSym0 #

STraversable t => SingI (MapAccumLSym0 :: TyFun (a ~> (b ~> (a, c))) (a ~> (t b ~> (a, t c))) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

Methods

sing :: Sing MapAccumLSym0 #

SingI (ZipWith3Sym0 :: TyFun (a ~> (b ~> (c ~> d))) ([a] ~> ([b] ~> ([c] ~> [d]))) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing ZipWith3Sym0 #

SingI d => SingI (Either_Sym1 d :: TyFun (b ~> c) (Either a b ~> c) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Either

Methods

sing :: Sing (Either_Sym1 d) #

(SFoldable t, SApplicative f) => SingI (Traverse_Sym0 :: TyFun (a ~> f b) (t a ~> f ()) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

Methods

sing :: Sing Traverse_Sym0 #

(SFoldable t, SMonad m) => SingI (MapM_Sym0 :: TyFun (a ~> m b) (t a ~> m ()) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

Methods

sing :: Sing MapM_Sym0 #

(SFoldable t, SMonad m) => SingI (FoldrMSym0 :: TyFun (a ~> (b ~> m b)) (b ~> (t a ~> m b)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

Methods

sing :: Sing FoldrMSym0 #

(SFoldable t, SMonad m) => SingI (FoldlMSym0 :: TyFun (b ~> (a ~> m b)) (b ~> (t a ~> m b)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

Methods

sing :: Sing FoldlMSym0 #

SingI d => SingI ((.@#@$$) d :: TyFun (a ~> b) (a ~> c) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Base

Methods

sing :: Sing ((.@#@$$) d) #

SMonad m => SingI (LiftM2Sym0 :: TyFun (a1 ~> (a2 ~> r)) (m a1 ~> (m a2 ~> m r)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

Methods

sing :: Sing LiftM2Sym0 #

SApplicative f => SingI (LiftA2Sym0 :: TyFun (a ~> (b ~> c)) (f a ~> (f b ~> f c)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

Methods

sing :: Sing LiftA2Sym0 #

(SMonad m, SingI d) => SingI ((>>=@#@$$) d :: TyFun (a ~> m b) (m b) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

Methods

sing :: Sing ((>>=@#@$$) d) #

(SFunctor f, SingI d) => SingI ((<&>@#@$$) d :: TyFun (a ~> b) (f b) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Functor

Methods

sing :: Sing ((<&>@#@$$) d) #

SApplicative m => SingI (ZipWithM_Sym0 :: TyFun (a ~> (b ~> m c)) ([a] ~> ([b] ~> m ())) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad

Methods

sing :: Sing ZipWithM_Sym0 #

SApplicative m => SingI (ZipWithMSym0 :: TyFun (a ~> (b ~> m c)) ([a] ~> ([b] ~> m [c])) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad

Methods

sing :: Sing ZipWithMSym0 #

SApplicative m => SingI (MapAndUnzipMSym0 :: TyFun (a ~> m (b, c)) ([a] ~> m ([b], [c])) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad

Methods

sing :: Sing MapAndUnzipMSym0 #

(SFoldable t, SMonad m) => SingI (FoldM_Sym0 :: TyFun (b ~> (a ~> m b)) (b ~> (t a ~> m ())) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad

Methods

sing :: Sing FoldM_Sym0 #

(SFoldable t, SMonad m) => SingI (FoldMSym0 :: TyFun (b ~> (a ~> m b)) (b ~> (t a ~> m b)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad

Methods

sing :: Sing FoldMSym0 #

SMonad m => SingI ((>=>@#@$) :: TyFun (a ~> m b) ((b ~> m c) ~> (a ~> m c)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad

Methods

sing :: Sing (>=>@#@$) #

SMonad m => SingI ((<=<@#@$) :: TyFun (b ~> m c) ((a ~> m b) ~> (a ~> m c)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad

Methods

sing :: Sing (<=<@#@$) #

SingI (Unzip5Sym0 :: TyFun [(a, b, c, d, e)] ([a], [b], [c], [d], [e]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing Unzip5Sym0 #

(SingI d1, SingI d2) => SingI (ListzipWithSym2 d1 d2 :: TyFun [b] [c] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

Methods

sing :: Sing (ListzipWithSym2 d1 d2) #

(SingI d1, SingI d2) => SingI (ZipWithSym2 d1 d2 :: TyFun [b] [c] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing (ZipWithSym2 d1 d2) #

SingI d2 => SingI (ZipWith3Sym1 d2 :: TyFun [a] ([b] ~> ([c] ~> [d1])) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing (ZipWith3Sym1 d2) #

(SingI d1, SingI d2) => SingI (Zip3Sym2 d1 d2 :: TyFun [c] [(a, b, c)] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing (Zip3Sym2 d1 d2) #

(SingI d1, SingI d2) => SingI (MapAccumRSym2 d1 d2 :: TyFun [x] (acc, [y]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing (MapAccumRSym2 d1 d2) #

(SingI d1, SingI d2) => SingI (MapAccumLSym2 d1 d2 :: TyFun [x] (acc, [y]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing (MapAccumLSym2 d1 d2) #

(SApplicative m, SingI d) => SingI (ZipWithM_Sym1 d :: TyFun [a] ([b] ~> m ()) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad

Methods

sing :: Sing (ZipWithM_Sym1 d) #

(SApplicative m, SingI d) => SingI (ZipWithMSym1 d :: TyFun [a] ([b] ~> m [c]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad

Methods

sing :: Sing (ZipWithMSym1 d) #

(SApplicative m, SingI d) => SingI (MapAndUnzipMSym1 d :: TyFun [a] (m ([b], [c])) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad

Methods

sing :: Sing (MapAndUnzipMSym1 d) #

(SingI d1, SingI d2) => SingI (Either_Sym2 d1 d2 :: TyFun (Either a b) c -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Either

Methods

sing :: Sing (Either_Sym2 d1 d2) #

(SingI d1, SingI d2) => SingI (CurrySym2 d1 d2 :: TyFun b c -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Tuple

Methods

sing :: Sing (CurrySym2 d1 d2) #

(STraversable t, SApplicative f, SingI d) => SingI (TraverseSym1 d :: TyFun (t a) (f (t b)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

Methods

sing :: Sing (TraverseSym1 d) #

(STraversable t, SMonad m, SingI d) => SingI (MapMSym1 d :: TyFun (t a) (m (t b)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

Methods

sing :: Sing (MapMSym1 d) #

(STraversable t, SingI d) => SingI (MapAccumRSym1 d :: TyFun a (t b ~> (a, t c)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

Methods

sing :: Sing (MapAccumRSym1 d) #

(STraversable t, SingI d) => SingI (MapAccumLSym1 d :: TyFun a (t b ~> (a, t c)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

Methods

sing :: Sing (MapAccumLSym1 d) #

(SFoldable t, SApplicative f, SingI d) => SingI (Traverse_Sym1 d :: TyFun (t a) (f ()) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

Methods

sing :: Sing (Traverse_Sym1 d) #

(SFoldable t, SMonad m, SingI d) => SingI (MapM_Sym1 d :: TyFun (t a) (m ()) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

Methods

sing :: Sing (MapM_Sym1 d) #

(SFoldable t, SingI d1, SingI d2) => SingI (FoldrSym2 d1 d2 :: TyFun (t a) b -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

Methods

sing :: Sing (FoldrSym2 d1 d2) #

(SFoldable t, SMonad m, SingI d) => SingI (FoldrMSym1 d :: TyFun b (t a ~> m b) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

Methods

sing :: Sing (FoldrMSym1 d) #

(SFoldable t, SingI d1, SingI d2) => SingI (Foldr'Sym2 d1 d2 :: TyFun (t a) b -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

Methods

sing :: Sing (Foldr'Sym2 d1 d2) #

(SFoldable t, SingI d1, SingI d2) => SingI (FoldlSym2 d1 d2 :: TyFun (t a) b -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

Methods

sing :: Sing (FoldlSym2 d1 d2) #

(SFoldable t, SMonad m, SingI d) => SingI (FoldlMSym1 d :: TyFun b (t a ~> m b) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

Methods

sing :: Sing (FoldlMSym1 d) #

(SFoldable t, SingI d1, SingI d2) => SingI (Foldl'Sym2 d1 d2 :: TyFun (t a) b -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

Methods

sing :: Sing (Foldl'Sym2 d1 d2) #

(SingI d1, SingI d2) => SingI (FlipSym2 d1 d2 :: TyFun a c -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Base

Methods

sing :: Sing (FlipSym2 d1 d2) #

(SingI d1, SingI d2) => SingI (d1 .@#@$$$ d2 :: TyFun a c -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Base

Methods

sing :: Sing (d1 .@#@$$$ d2) #

(SMonad m, SingI d) => SingI (LiftM2Sym1 d :: TyFun (m a1) (m a2 ~> m r) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

Methods

sing :: Sing (LiftM2Sym1 d) #

(SApplicative f, SingI d) => SingI (LiftA2Sym1 d :: TyFun (f a) (f b ~> f c) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

Methods

sing :: Sing (LiftA2Sym1 d) #

(SMonad m, SingI d) => SingI ((>>@#@$$) d :: TyFun (m b) (m b) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

Methods

sing :: Sing ((>>@#@$$) d) #

(SApplicative f, SingI d) => SingI ((<*@#@$$) d :: TyFun (f b) (f a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

Methods

sing :: Sing ((<*@#@$$) d) #

(SApplicative f, SingI d) => SingI ((*>@#@$$) d :: TyFun (f b) (f b) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

Methods

sing :: Sing ((*>@#@$$) d) #

SingI (Tuple5Sym0 :: TyFun a (b ~> (c ~> (d ~> (e ~> (a, b, c, d, e))))) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Instances

Methods

sing :: Sing Tuple5Sym0 #

SingI d1 => SingI (Tuple4Sym1 d1 :: TyFun b (c ~> (d2 ~> (a, b, c, d2))) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Instances

Methods

sing :: Sing (Tuple4Sym1 d1) #

(SingI d1, SingI d2) => SingI (Tuple3Sym2 d1 d2 :: TyFun c (a, b, c) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Instances

Methods

sing :: Sing (Tuple3Sym2 d1 d2) #

(SFoldable t, SMonad m, SingI d) => SingI (FoldM_Sym1 d :: TyFun b (t a ~> m ()) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad

Methods

sing :: Sing (FoldM_Sym1 d) #

(SFoldable t, SMonad m, SingI d) => SingI (FoldMSym1 d :: TyFun b (t a ~> m b) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad

Methods

sing :: Sing (FoldMSym1 d) #

(STraversable t, SApplicative f, SingI d) => SingI (ForSym1 d :: TyFun (a ~> f b) (f (t b)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

Methods

sing :: Sing (ForSym1 d) #

(STraversable t, SMonad m, SingI d) => SingI (ForMSym1 d :: TyFun (a ~> m b) (m (t b)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

Methods

sing :: Sing (ForMSym1 d) #

(SFoldable t, SApplicative f, SingI d) => SingI (For_Sym1 d :: TyFun (a ~> f b) (f ()) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

Methods

sing :: Sing (For_Sym1 d) #

(SFoldable t, SMonad m, SingI d) => SingI (ForM_Sym1 d :: TyFun (a ~> m b) (m ()) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

Methods

sing :: Sing (ForM_Sym1 d) #

SMonad m => SingI (LiftM3Sym0 :: TyFun (a1 ~> (a2 ~> (a3 ~> r))) (m a1 ~> (m a2 ~> (m a3 ~> m r))) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

Methods

sing :: Sing LiftM3Sym0 #

SApplicative f => SingI (LiftA3Sym0 :: TyFun (a ~> (b ~> (c ~> d))) (f a ~> (f b ~> (f c ~> f d))) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

Methods

sing :: Sing LiftA3Sym0 #

(SMonad m, SingI d) => SingI ((>=>@#@$$) d :: TyFun (b ~> m c) (a ~> m c) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad

Methods

sing :: Sing ((>=>@#@$$) d) #

(SMonad m, SingI d) => SingI ((<=<@#@$$) d :: TyFun (a ~> m b) (a ~> m c) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad

Methods

sing :: Sing ((<=<@#@$$) d) #

SingI (Unzip6Sym0 :: TyFun [(a, b, c, d, e, f)] ([a], [b], [c], [d], [e], [f]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing Unzip6Sym0 #

(SingI d2, SingI d3) => SingI (ZipWith3Sym2 d2 d3 :: TyFun [b] ([c] ~> [d1]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing (ZipWith3Sym2 d2 d3) #

(SApplicative m, SingI d1, SingI d2) => SingI (ZipWithM_Sym2 d1 d2 :: TyFun [b] (m ()) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad

Methods

sing :: Sing (ZipWithM_Sym2 d1 d2) #

(SApplicative m, SingI d1, SingI d2) => SingI (ZipWithMSym2 d1 d2 :: TyFun [b] (m [c]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad

Methods

sing :: Sing (ZipWithMSym2 d1 d2) #

(STraversable t, SingI d1, SingI d2) => SingI (MapAccumRSym2 d1 d2 :: TyFun (t b) (a, t c) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

Methods

sing :: Sing (MapAccumRSym2 d1 d2) #

(STraversable t, SingI d1, SingI d2) => SingI (MapAccumLSym2 d1 d2 :: TyFun (t b) (a, t c) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

Methods

sing :: Sing (MapAccumLSym2 d1 d2) #

(SFoldable t, SMonad m, SingI d1, SingI d2) => SingI (FoldrMSym2 d1 d2 :: TyFun (t a) (m b) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

Methods

sing :: Sing (FoldrMSym2 d1 d2) #

(SFoldable t, SMonad m, SingI d1, SingI d2) => SingI (FoldlMSym2 d1 d2 :: TyFun (t a) (m b) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

Methods

sing :: Sing (FoldlMSym2 d1 d2) #

(SMonad m, SingI d) => SingI (LiftM3Sym1 d :: TyFun (m a1) (m a2 ~> (m a3 ~> m r)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

Methods

sing :: Sing (LiftM3Sym1 d) #

(SMonad m, SingI d1, SingI d2) => SingI (LiftM2Sym2 d1 d2 :: TyFun (m a2) (m r) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

Methods

sing :: Sing (LiftM2Sym2 d1 d2) #

(SApplicative f, SingI d2) => SingI (LiftA3Sym1 d2 :: TyFun (f a) (f b ~> (f c ~> f d1)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

Methods

sing :: Sing (LiftA3Sym1 d2) #

(SApplicative f, SingI d1, SingI d2) => SingI (LiftA2Sym2 d1 d2 :: TyFun (f b) (f c) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

Methods

sing :: Sing (LiftA2Sym2 d1 d2) #

SingI (Tuple6Sym0 :: TyFun a (b ~> (c ~> (d ~> (e ~> (f ~> (a, b, c, d, e, f)))))) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Instances

Methods

sing :: Sing Tuple6Sym0 #

SingI d1 => SingI (Tuple5Sym1 d1 :: TyFun b (c ~> (d2 ~> (e ~> (a, b, c, d2, e)))) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Instances

Methods

sing :: Sing (Tuple5Sym1 d1) #

(SingI d1, SingI d2) => SingI (Tuple4Sym2 d1 d2 :: TyFun c (d3 ~> (a, b, c, d3)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Instances

Methods

sing :: Sing (Tuple4Sym2 d1 d2) #

(SFoldable t, SMonad m, SingI d1, SingI d2) => SingI (FoldM_Sym2 d1 d2 :: TyFun (t a) (m ()) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad

Methods

sing :: Sing (FoldM_Sym2 d1 d2) #

(SFoldable t, SMonad m, SingI d1, SingI d2) => SingI (FoldMSym2 d1 d2 :: TyFun (t a) (m b) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad

Methods

sing :: Sing (FoldMSym2 d1 d2) #

(SMonad m, SingI d1, SingI d2) => SingI (d1 >=>@#@$$$ d2 :: TyFun a (m c) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad

Methods

sing :: Sing (d1 >=>@#@$$$ d2) #

(SMonad m, SingI d1, SingI d2) => SingI (d1 <=<@#@$$$ d2 :: TyFun a (m c) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad

Methods

sing :: Sing (d1 <=<@#@$$$ d2) #

SMonad m => SingI (LiftM4Sym0 :: TyFun (a1 ~> (a2 ~> (a3 ~> (a4 ~> r)))) (m a1 ~> (m a2 ~> (m a3 ~> (m a4 ~> m r)))) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

Methods

sing :: Sing LiftM4Sym0 #

SingI (Unzip7Sym0 :: TyFun [(a, b, c, d, e, f, g)] ([a], [b], [c], [d], [e], [f], [g]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing Unzip7Sym0 #

(SingI d2, SingI d3, SingI d4) => SingI (ZipWith3Sym3 d2 d3 d4 :: TyFun [c] [d1] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing (ZipWith3Sym3 d2 d3 d4) #

(SMonad m, SingI d) => SingI (LiftM4Sym1 d :: TyFun (m a1) (m a2 ~> (m a3 ~> (m a4 ~> m r))) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

Methods

sing :: Sing (LiftM4Sym1 d) #

(SMonad m, SingI d1, SingI d2) => SingI (LiftM3Sym2 d1 d2 :: TyFun (m a2) (m a3 ~> m r) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

Methods

sing :: Sing (LiftM3Sym2 d1 d2) #

(SApplicative f, SingI d2, SingI d3) => SingI (LiftA3Sym2 d2 d3 :: TyFun (f b) (f c ~> f d1) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

Methods

sing :: Sing (LiftA3Sym2 d2 d3) #

SingI (Tuple7Sym0 :: TyFun a (b ~> (c ~> (d ~> (e ~> (f ~> (g ~> (a, b, c, d, e, f, g))))))) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Instances

Methods

sing :: Sing Tuple7Sym0 #

SingI d1 => SingI (Tuple6Sym1 d1 :: TyFun b (c ~> (d2 ~> (e ~> (f ~> (a, b, c, d2, e, f))))) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Instances

Methods

sing :: Sing (Tuple6Sym1 d1) #

(SingI d1, SingI d2) => SingI (Tuple5Sym2 d1 d2 :: TyFun c (d3 ~> (e ~> (a, b, c, d3, e))) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Instances

Methods

sing :: Sing (Tuple5Sym2 d1 d2) #

(SingI d1, SingI d2, SingI d3) => SingI (Tuple4Sym3 d1 d2 d3 :: TyFun d4 (a, b, c, d4) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Instances

Methods

sing :: Sing (Tuple4Sym3 d1 d2 d3) #

SMonad m => SingI (LiftM5Sym0 :: TyFun (a1 ~> (a2 ~> (a3 ~> (a4 ~> (a5 ~> r))))) (m a1 ~> (m a2 ~> (m a3 ~> (m a4 ~> (m a5 ~> m r))))) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

Methods

sing :: Sing LiftM5Sym0 #

(SMonad m, SingI d) => SingI (LiftM5Sym1 d :: TyFun (m a1) (m a2 ~> (m a3 ~> (m a4 ~> (m a5 ~> m r)))) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

Methods

sing :: Sing (LiftM5Sym1 d) #

(SMonad m, SingI d1, SingI d2) => SingI (LiftM4Sym2 d1 d2 :: TyFun (m a2) (m a3 ~> (m a4 ~> m r)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

Methods

sing :: Sing (LiftM4Sym2 d1 d2) #

(SMonad m, SingI d1, SingI d2, SingI d3) => SingI (LiftM3Sym3 d1 d2 d3 :: TyFun (m a3) (m r) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

Methods

sing :: Sing (LiftM3Sym3 d1 d2 d3) #

(SApplicative f, SingI d2, SingI d3, SingI d4) => SingI (LiftA3Sym3 d2 d3 d4 :: TyFun (f c) (f d1) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

Methods

sing :: Sing (LiftA3Sym3 d2 d3 d4) #

SingI d1 => SingI (Tuple7Sym1 d1 :: TyFun b (c ~> (d2 ~> (e ~> (f ~> (g ~> (a, b, c, d2, e, f, g)))))) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Instances

Methods

sing :: Sing (Tuple7Sym1 d1) #

(SingI d1, SingI d2) => SingI (Tuple6Sym2 d1 d2 :: TyFun c (d3 ~> (e ~> (f ~> (a, b, c, d3, e, f)))) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Instances

Methods

sing :: Sing (Tuple6Sym2 d1 d2) #

(SingI d1, SingI d2, SingI d3) => SingI (Tuple5Sym3 d1 d2 d3 :: TyFun d4 (e ~> (a, b, c, d4, e)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Instances

Methods

sing :: Sing (Tuple5Sym3 d1 d2 d3) #

(SMonad m, SingI d1, SingI d2) => SingI (LiftM5Sym2 d1 d2 :: TyFun (m a2) (m a3 ~> (m a4 ~> (m a5 ~> m r))) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

Methods

sing :: Sing (LiftM5Sym2 d1 d2) #

(SMonad m, SingI d1, SingI d2, SingI d3) => SingI (LiftM4Sym3 d1 d2 d3 :: TyFun (m a3) (m a4 ~> m r) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

Methods

sing :: Sing (LiftM4Sym3 d1 d2 d3) #

(SingI d1, SingI d2) => SingI (Tuple7Sym2 d1 d2 :: TyFun c (d3 ~> (e ~> (f ~> (g ~> (a, b, c, d3, e, f, g))))) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Instances

Methods

sing :: Sing (Tuple7Sym2 d1 d2) #

(SingI d1, SingI d2, SingI d3) => SingI (Tuple6Sym3 d1 d2 d3 :: TyFun d4 (e ~> (f ~> (a, b, c, d4, e, f))) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Instances

Methods

sing :: Sing (Tuple6Sym3 d1 d2 d3) #

(SingI d1, SingI d2, SingI d3, SingI d5) => SingI (Tuple5Sym4 d1 d2 d3 d5 :: TyFun e (a, b, c, d4, e) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Instances

Methods

sing :: Sing (Tuple5Sym4 d1 d2 d3 d5) #

(SMonad m, SingI d1, SingI d2, SingI d3) => SingI (LiftM5Sym3 d1 d2 d3 :: TyFun (m a3) (m a4 ~> (m a5 ~> m r)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

Methods

sing :: Sing (LiftM5Sym3 d1 d2 d3) #

(SMonad m, SingI d1, SingI d2, SingI d3, SingI d4) => SingI (LiftM4Sym4 d1 d2 d3 d4 :: TyFun (m a4) (m r) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

Methods

sing :: Sing (LiftM4Sym4 d1 d2 d3 d4) #

(SingI d1, SingI d2, SingI d3) => SingI (Tuple7Sym3 d1 d2 d3 :: TyFun d4 (e ~> (f ~> (g ~> (a, b, c, d4, e, f, g)))) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Instances

Methods

sing :: Sing (Tuple7Sym3 d1 d2 d3) #

(SingI d1, SingI d2, SingI d3, SingI d5) => SingI (Tuple6Sym4 d1 d2 d3 d5 :: TyFun e (f ~> (a, b, c, d4, e, f)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Instances

Methods

sing :: Sing (Tuple6Sym4 d1 d2 d3 d5) #

(SMonad m, SingI d1, SingI d2, SingI d3, SingI d4) => SingI (LiftM5Sym4 d1 d2 d3 d4 :: TyFun (m a4) (m a5 ~> m r) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

Methods

sing :: Sing (LiftM5Sym4 d1 d2 d3 d4) #

(SingI d1, SingI d2, SingI d3, SingI d5) => SingI (Tuple7Sym4 d1 d2 d3 d5 :: TyFun e (f ~> (g ~> (a, b, c, d4, e, f, g))) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Instances

Methods

sing :: Sing (Tuple7Sym4 d1 d2 d3 d5) #

(SingI d1, SingI d2, SingI d3, SingI d5, SingI d6) => SingI (Tuple6Sym5 d1 d2 d3 d5 d6 :: TyFun f (a, b, c, d4, e, f) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Instances

Methods

sing :: Sing (Tuple6Sym5 d1 d2 d3 d5 d6) #

(SMonad m, SingI d1, SingI d2, SingI d3, SingI d4, SingI d5) => SingI (LiftM5Sym5 d1 d2 d3 d4 d5 :: TyFun (m a5) (m r) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

Methods

sing :: Sing (LiftM5Sym5 d1 d2 d3 d4 d5) #

(SingI d1, SingI d2, SingI d3, SingI d5, SingI d6) => SingI (Tuple7Sym5 d1 d2 d3 d5 d6 :: TyFun f (g ~> (a, b, c, d4, e, f, g)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Instances

Methods

sing :: Sing (Tuple7Sym5 d1 d2 d3 d5 d6) #

(SingI d1, SingI d2, SingI d3, SingI d5, SingI d6, SingI d7) => SingI (Tuple7Sym6 d1 d2 d3 d5 d6 d7 :: TyFun g (a, b, c, d4, e, f, g) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Instances

Methods

sing :: Sing (Tuple7Sym6 d1 d2 d3 d5 d6 d7) #

class SingKind k where #

Associated Types

type Demote k = (r :: Type) | r -> k #

Methods

fromSing :: forall (a :: k). Sing a -> Demote k #

toSing :: Demote k -> SomeSing k #

Instances

Instances details
SingKind a => SingKind (MaxInternal a) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

Associated Types

type Demote (MaxInternal a) = (r :: Type) #

Methods

fromSing :: forall (a0 :: MaxInternal a). Sing a0 -> Demote (MaxInternal a) #

toSing :: Demote (MaxInternal a) -> SomeSing (MaxInternal a) #

SingKind a => SingKind (MinInternal a) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

Associated Types

type Demote (MinInternal a) = (r :: Type) #

Methods

fromSing :: forall (a0 :: MinInternal a). Sing a0 -> Demote (MinInternal a) #

toSing :: Demote (MinInternal a) -> SomeSing (MinInternal a) #

SingKind (WrappedSing a) 
Instance details

Defined in Data.Singletons.Internal

Associated Types

type Demote (WrappedSing a) = (r :: Type) #

Methods

fromSing :: forall (a0 :: WrappedSing a). Sing a0 -> Demote (WrappedSing a) #

toSing :: Demote (WrappedSing a) -> SomeSing (WrappedSing a) #

(SingKind k1, SingKind k2) => SingKind (k1 ~> k2) 
Instance details

Defined in Data.Singletons.Internal

Associated Types

type Demote (k1 ~> k2) = (r :: Type) #

Methods

fromSing :: forall (a :: k1 ~> k2). Sing a -> Demote (k1 ~> k2) #

toSing :: Demote (k1 ~> k2) -> SomeSing (k1 ~> k2) #

data SomeSing k where #

Constructors

SomeSing :: forall k (a :: k). Sing a -> SomeSing k 

pattern (:<) :: (Dom f a, KnownNat n, CFreeMonoid f) => (n ~ (1 + n1), KnownNat n1) => a -> Sized f n1 a -> Sized f n a #

pattern (:>) :: (Dom f a, KnownNat n, CFreeMonoid f) => (n ~ (n1 + 1), KnownNat n1) => Sized f n1 a -> a -> Sized f n a #

pattern Nil :: forall f n a. (KnownNat n, CFreeMonoid f, Dom f a) => n ~ 0 => Sized f n a #

generate :: forall (f :: Type -> Type) (n :: Nat) a. (CFreeMonoid f, Dom f a) => SNat n -> (Ordinal n -> a) -> Sized f n a #

sIndex :: forall (f :: Type -> Type) (n :: Nat) c. (CFoldable f, Dom f c) => Ordinal n -> Sized f n c -> c #

singleton :: forall (f :: Type -> Type) a. (CPointed f, Dom f a) => a -> Sized f 1 a #

unsafeFromList :: forall (f :: Type -> Type) (n :: Nat) a. (CFreeMonoid f, Dom f a) => SNat n -> [a] -> Sized f n a #

unsafeFromList' :: forall (f :: Type -> Type) (n :: Nat) a. (KnownNat n, CFreeMonoid f, Dom f a) => [a] -> Sized f n a #

zipWithSame :: forall (f :: Type -> Type) (n :: Nat) a b c. (Dom f a, CZip f, Dom f b, CFreeMonoid f, Dom f c) => (a -> b -> c) -> Sized f n a -> Sized f n b -> Sized f n c #

viewNat :: forall (n :: Nat). SNat n -> ZeroOrSucc n #

type Pred (n :: Nat) = n - 1 #

data SNat (n :: Nat) where #

Bundled Patterns

pattern Zero :: () => n ~ 0 => SNat n 
pattern Succ :: forall n n1. () => n ~ Succ n1 => SNat n1 -> SNat n 

Instances

Instances details
TestEquality SNat 
Instance details

Defined in Data.Type.Natural.Core

Methods

testEquality :: forall (a :: k) (b :: k). SNat a -> SNat b -> Maybe (a :~: b) #

Eq (SNat n) 
Instance details

Defined in Data.Type.Natural.Core

Methods

(==) :: SNat n -> SNat n -> Bool #

(/=) :: SNat n -> SNat n -> Bool #

Ord (SNat n) 
Instance details

Defined in Data.Type.Natural.Core

Methods

compare :: SNat n -> SNat n -> Ordering #

(<) :: SNat n -> SNat n -> Bool #

(<=) :: SNat n -> SNat n -> Bool #

(>) :: SNat n -> SNat n -> Bool #

(>=) :: SNat n -> SNat n -> Bool #

max :: SNat n -> SNat n -> SNat n #

min :: SNat n -> SNat n -> SNat n #

Show (SNat n) 
Instance details

Defined in Data.Type.Natural.Core

Methods

showsPrec :: Int -> SNat n -> ShowS #

show :: SNat n -> String #

showList :: [SNat n] -> ShowS #

type (<) (n :: Nat) (m :: Nat) = (n <? m) ~ 'True #

type Succ (n :: Nat) = n + 1 #

type (-.) (n :: Nat) (m :: Nat) = Subt n m (m <=? n) #

type S (n :: Nat) = Succ n #

type Min (n :: Nat) (m :: Nat) = MinAux (n <=? m) n m #

withKnownNat :: forall (n :: Nat) r. SNat n -> (KnownNat n => r) -> r #

toNatural :: forall (n :: Nat). SNat n -> Natural #

sNatP :: forall (n :: Nat) pxy. KnownNat n => pxy n -> SNat n #

withSNat :: Natural -> (forall (n :: Nat). KnownNat n => SNat n -> r) -> r #

(%*) :: forall (n :: Nat) (m :: Nat). SNat n -> SNat m -> SNat (n * m) #

(%+) :: forall (n :: Nat) (m :: Nat). SNat n -> SNat m -> SNat (n + m) #

(%-) :: forall (n :: Nat) (m :: Nat). SNat n -> SNat m -> SNat (n - m) #

(%<=?) :: forall (n :: Nat) (m :: Nat). SNat n -> SNat m -> SBool (n <=? m) #

(%^) :: forall (n :: Nat) (m :: Nat). SNat n -> SNat m -> SNat (n ^ m) #

sCmpNat :: forall (n :: Nat) (m :: Nat). SNat n -> SNat m -> SOrdering (CmpNat n m) #

sCompare :: forall (n :: Nat) (m :: Nat). SNat n -> SNat m -> SOrdering (CmpNat n m) #

sDiv :: forall (n :: Nat) (m :: Nat). SNat n -> SNat m -> SNat (Div n m) #

sFlipOrdering :: forall (ord :: Ordering). SOrdering ord -> SOrdering (FlipOrdering ord) #

sLog2 :: forall (n :: Nat). SNat n -> SNat (Log2 n) #

sMod :: forall (n :: Nat) (m :: Nat). SNat n -> SNat m -> SNat (Mod n m) #

sNat :: forall (n :: Nat). KnownNat n => SNat n #

sOne :: SNat 1 #

sPred :: forall (n :: Nat). SNat n -> SNat (Pred n) #

sS :: forall (n :: Nat). SNat n -> SNat (Succ n) #

sSucc :: forall (n :: Nat). SNat n -> SNat (Succ n) #

sZero :: SNat 0 #

induction :: forall p (k :: Nat). p 0 -> (forall (n :: Nat). SNat n -> p n -> p (S n)) -> SNat k -> p k #

zeroOrSucc :: forall (n :: Nat). SNat n -> ZeroOrSucc n #

(%-.) :: forall (n :: Nat) (m :: Nat). SNat n -> SNat m -> SNat (n -. m) #

(%<?) :: forall (n :: Nat) (m :: Nat). SNat n -> SNat m -> SBool (n <? m) #

(%>=?) :: forall (n :: Nat) (m :: Nat). SNat n -> SNat m -> SBool (n >=? m) #

(%>?) :: forall (n :: Nat) (m :: Nat). SNat n -> SNat m -> SBool (n >? m) #

sMax :: forall (n :: Nat) (m :: Nat). SNat n -> SNat m -> SNat (Max n m) #

sMin :: forall (n :: Nat) (m :: Nat). SNat n -> SNat m -> SNat (Min n m) #

data SomeSNat where #

Constructors

SomeSNat :: forall (n :: Nat). KnownNat n => SNat n -> SomeSNat 

Instances

Instances details
Eq SomeSNat 
Instance details

Defined in Data.Type.Natural

Show SomeSNat 
Instance details

Defined in Data.Type.Natural

type family (a :: k) === (b :: k) :: Bool where ... #

Equations

(a :: k) === (a :: k) = 'True 
(_1 :: k) === (_2 :: k) = 'False 

data Equality (n :: k) (m :: k) where #

Constructors

Equal :: forall k (n :: k). (n == n) ~ 'True => Equality n n 
NonEqual :: forall k (n :: k) (m :: k). ((n === m) ~ 'False, (n == m) ~ 'False) => Equality n m 

type family FlipOrdering (ord :: Ordering) :: Ordering where ... #

Equations

FlipOrdering 'LT = 'GT 
FlipOrdering 'GT = 'LT 
FlipOrdering 'EQ = 'EQ 

type One = 1 #

data SBool (b :: Bool) where #

Constructors

SFalse :: SBool 'False 
STrue :: SBool 'True 

Instances

Instances details
Eq (SBool ord) 
Instance details

Defined in Data.Type.Natural.Core

Methods

(==) :: SBool ord -> SBool ord -> Bool #

(/=) :: SBool ord -> SBool ord -> Bool #

Show (SBool ord) 
Instance details

Defined in Data.Type.Natural.Core

Methods

showsPrec :: Int -> SBool ord -> ShowS #

show :: SBool ord -> String #

showList :: [SBool ord] -> ShowS #

data SOrdering (ord :: Ordering) where #

Constructors

SLT :: SOrdering 'LT 
SEQ :: SOrdering 'EQ 
SGT :: SOrdering 'GT 

Instances

Instances details
Eq (SOrdering ord) 
Instance details

Defined in Data.Type.Natural.Core

Methods

(==) :: SOrdering ord -> SOrdering ord -> Bool #

(/=) :: SOrdering ord -> SOrdering ord -> Bool #

Show (SOrdering ord) 
Instance details

Defined in Data.Type.Natural.Core

Methods

showsPrec :: Int -> SOrdering ord -> ShowS #

show :: SOrdering ord -> String #

showList :: [SOrdering ord] -> ShowS #

type Zero = 0 #

data ZeroOrSucc (n :: Nat) where #

Constructors

IsZero :: ZeroOrSucc 0 
IsSucc :: forall (n1 :: Nat). SNat n1 -> ZeroOrSucc (n1 + 1) 

type (<?) (n :: Nat) (m :: Nat) = (n + 1) <=? m #

type (>) (n :: Nat) (m :: Nat) = (n >? m) ~ 'True #

type (>=) (n :: Nat) (m :: Nat) = (n >=? m) ~ 'True #

type (>=?) (n :: Nat) (m :: Nat) = m <=? n #

type (>?) (n :: Nat) (m :: Nat) = m <? n #

type Max (n :: Nat) (m :: Nat) = MaxAux (n >=? m) n m #

data IsTrue (b :: Bool) where #

Constructors

Witness :: IsTrue 'True 

Instances

Instances details
Eq (IsTrue b) 
Instance details

Defined in Proof.Propositional

Methods

(==) :: IsTrue b -> IsTrue b -> Bool #

(/=) :: IsTrue b -> IsTrue b -> Bool #

Data (IsTrue 'True) 
Instance details

Defined in Proof.Propositional

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> IsTrue 'True -> c (IsTrue 'True) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (IsTrue 'True) #

toConstr :: IsTrue 'True -> Constr #

dataTypeOf :: IsTrue 'True -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (IsTrue 'True)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (IsTrue 'True)) #

gmapT :: (forall b. Data b => b -> b) -> IsTrue 'True -> IsTrue 'True #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> IsTrue 'True -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> IsTrue 'True -> r #

gmapQ :: (forall d. Data d => d -> u) -> IsTrue 'True -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> IsTrue 'True -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> IsTrue 'True -> m (IsTrue 'True) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> IsTrue 'True -> m (IsTrue 'True) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> IsTrue 'True -> m (IsTrue 'True) #

Ord (IsTrue b) 
Instance details

Defined in Proof.Propositional

Methods

compare :: IsTrue b -> IsTrue b -> Ordering #

(<) :: IsTrue b -> IsTrue b -> Bool #

(<=) :: IsTrue b -> IsTrue b -> Bool #

(>) :: IsTrue b -> IsTrue b -> Bool #

(>=) :: IsTrue b -> IsTrue b -> Bool #

max :: IsTrue b -> IsTrue b -> IsTrue b #

min :: IsTrue b -> IsTrue b -> IsTrue b #

Read (IsTrue 'True) 
Instance details

Defined in Proof.Propositional

Show (IsTrue b) 
Instance details

Defined in Proof.Propositional

Methods

showsPrec :: Int -> IsTrue b -> ShowS #

show :: IsTrue b -> String #

showList :: [IsTrue b] -> ShowS #

Empty (IsTrue 'False) 
Instance details

Defined in Proof.Propositional

Methods

eliminate :: IsTrue 'False -> x

Inhabited (IsTrue 'True) 
Instance details

Defined in Proof.Propositional

Methods

trivial :: IsTrue 'True

withWitness :: forall (b :: Bool) r. IsTrue b -> (b ~ 'True => r) -> r #

(===) :: forall k eq (x :: k) (y :: k) (z :: k). Equality eq => eq x y -> Reason eq y z -> eq x z #

(=~=) :: forall k1 k2 r (x :: k1) (y :: k2) proxy. r x y -> proxy y -> r x y #

because :: forall k1 k2 proxy (y :: k1) eq (x :: k2). proxy y -> eq x y -> Reason eq x y #

coerce :: forall k (a :: k) (b :: k) f. (a :=: b) -> f a -> f b #

start :: forall k eq proxy (a :: k). Preorder eq => proxy a -> eq a a #

type family Flipped f a :: Nat -> Type where ... Source #

Equations

Flipped f a = Flipped f a 

type Sized' n a = Sized Seq n a Source #

type Sized n a = Sized Vector n a Source #

type USized n a = Sized Vector n a Source #

pattern Flipped :: Sized f n a -> Flipped f a n Source #

toProxy :: a -> Proxy a Source #

coerceLength :: (n :~: m) -> Sized f n a -> Sized f m a Source #

sizedLength :: (KnownNat n, DomC f a) => Sized f n a -> SNat n Source #

padVecs :: forall a n m. (Unbox a, KnownNat n, KnownNat m) => a -> USized n a -> USized m a -> (SNat (Max n m), USized (Max n m) a, USized (Max n m) a) Source #

Orphan instances

Hashable a => Hashable (Seq a) Source # 
Instance details

Methods

hashWithSalt :: Int -> Seq a -> Int #

hash :: Seq a -> Int #