hasktorch-gradually-typed-0.2.0.0: experimental project for hasktorch
Safe HaskellSafe-Inferred
LanguageHaskell2010

Torch.GraduallyTyped.Prelude

Synopsis

Documentation

type Type = TYPE LiftedRep Source #

The kind of types with lifted values. For example Int :: Type.

data Constraint Source #

The kind of constraints, like Show a

data Proxy (t :: k) Source #

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
ApplicativeB (Proxy :: (k -> Type) -> Type) 
Instance details

Defined in Barbies.Internal.ApplicativeB

Methods

bpure :: (forall (a :: k0). f a) -> Proxy f Source #

bprod :: forall (f :: k0 -> Type) (g :: k0 -> Type). Proxy f -> Proxy g -> Proxy (Product f g) Source #

ConstraintsB (Proxy :: (k -> Type) -> Type) 
Instance details

Defined in Barbies.Internal.ConstraintsB

Associated Types

type AllB c Proxy Source #

Methods

baddDicts :: forall (c :: k0 -> Constraint) (f :: k0 -> Type). AllB c Proxy => Proxy f -> Proxy (Product (Dict c) f) Source #

DistributiveB (Proxy :: (k -> Type) -> Type) 
Instance details

Defined in Barbies.Internal.DistributiveB

Methods

bdistribute :: forall f (g :: k0 -> Type). Functor f => f (Proxy g) -> Proxy (Compose f g) Source #

FunctorB (Proxy :: (k -> Type) -> Type) 
Instance details

Defined in Barbies.Internal.FunctorB

Methods

bmap :: (forall (a :: k0). f a -> g a) -> Proxy f -> Proxy g Source #

TraversableB (Proxy :: (k -> Type) -> Type) 
Instance details

Defined in Barbies.Internal.TraversableB

Methods

btraverse :: Applicative e => (forall (a :: k0). f a -> e (g a)) -> Proxy f -> e (Proxy g) Source #

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

Defined in GHC.Generics

Associated Types

type Rep1 Proxy :: k -> Type Source #

Methods

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

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

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

Defined in Data.Functor.Rep

Associated Types

type Rep Proxy Source #

Methods

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

index :: Proxy a -> Rep Proxy -> a Source #

Foldable (Proxy :: TYPE LiftedRep -> Type)

Since: base-4.7.0.0

Instance details

Defined in Data.Foldable

Methods

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

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

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

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

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

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

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

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

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

toList :: Proxy a -> [a] Source #

null :: Proxy a -> Bool Source #

length :: Proxy a -> Int Source #

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

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

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

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

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

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 Source #

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 Source #

Read1 (Proxy :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Show1 (Proxy :: TYPE LiftedRep -> 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 Source #

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

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) Source #

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

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

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

Alternative (Proxy :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Proxy

Methods

empty :: Proxy a Source #

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

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

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

Applicative (Proxy :: Type -> Type)

Since: base-4.7.0.0

Instance details

Defined in Data.Proxy

Methods

pure :: a -> Proxy a Source #

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

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

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

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

Functor (Proxy :: Type -> Type)

Since: base-4.7.0.0

Instance details

Defined in Data.Proxy

Methods

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

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

Monad (Proxy :: Type -> Type)

Since: base-4.7.0.0

Instance details

Defined in Data.Proxy

Methods

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

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

return :: a -> Proxy a Source #

MonadPlus (Proxy :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Proxy

Methods

mzero :: Proxy a Source #

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

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

Defined in Data.Hashable.Class

Methods

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

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

Defined in Data.Foldable.Singletons

Associated Types

type Fold arg :: m Source #

type FoldMap arg arg1 :: m Source #

type Foldr arg arg1 arg2 :: b Source #

type Foldr' arg arg1 arg2 :: b Source #

type Foldl arg arg1 arg2 :: b Source #

type Foldl' arg arg1 arg2 :: b Source #

type Foldr1 arg arg1 :: a Source #

type Foldl1 arg arg1 :: a Source #

type ToList arg :: [a] Source #

type Null arg :: Bool Source #

type Length arg :: Natural Source #

type Elem arg arg1 :: Bool Source #

type Maximum arg :: a Source #

type Minimum arg :: a Source #

type Sum arg :: a Source #

type Product arg :: a Source #

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

Defined in Data.Foldable.Singletons

Methods

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

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

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) Source #

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) Source #

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) Source #

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) Source #

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

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

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

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

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

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

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

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

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

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

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

Defined in Data.Traversable.Singletons

Associated Types

type Traverse arg arg1 :: f (t b) Source #

type SequenceA arg :: f (t a) Source #

type MapM arg arg1 :: m (t b) Source #

type Sequence arg :: m (t a) Source #

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

Defined in Data.Traversable.Singletons

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) Source #

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

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) Source #

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

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) Source #

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

toConstr :: Proxy t -> Constr Source #

dataTypeOf :: Proxy t -> DataType Source #

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

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

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

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

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

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

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

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

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

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

Monoid (Proxy s)

Since: base-4.7.0.0

Instance details

Defined in Data.Proxy

Methods

mempty :: Proxy s Source #

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

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

Semigroup (Proxy s)

Since: base-4.9.0.0

Instance details

Defined in Data.Proxy

Methods

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

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

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

Bounded (Proxy t)

Since: base-4.7.0.0

Instance details

Defined in Data.Proxy

Enum (Proxy s)

Since: base-4.7.0.0

Instance details

Defined in Data.Proxy

Methods

succ :: Proxy s -> Proxy s Source #

pred :: Proxy s -> Proxy s Source #

toEnum :: Int -> Proxy s Source #

fromEnum :: Proxy s -> Int Source #

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

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

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

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

Generic (Proxy t) 
Instance details

Defined in GHC.Generics

Associated Types

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

Methods

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

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

Ix (Proxy s)

Since: base-4.7.0.0

Instance details

Defined in Data.Proxy

Methods

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

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

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

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

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

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

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

Eq (Proxy s)

Since: base-4.7.0.0

Instance details

Defined in Data.Proxy

Methods

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

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

Ord (Proxy s)

Since: base-4.7.0.0

Instance details

Defined in Data.Proxy

Methods

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

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

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

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

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

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

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

Hashable (Proxy a) 
Instance details

Defined in Data.Hashable.Class

Methods

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

hash :: Proxy a -> Int Source #

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

Defined in Data.Foldable.Singletons

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

Defined in Data.Foldable.Singletons

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

Defined in Data.Foldable.Singletons

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

Defined in Data.Foldable.Singletons

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

Defined in Data.Foldable.Singletons

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

Defined in Data.Proxy.Singletons

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

Defined in Data.Foldable.Singletons

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

Defined in Data.Proxy.Singletons

Methods

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

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

Defined in Data.Proxy.Singletons

Methods

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

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

Defined in Data.Proxy.Singletons

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

Defined in Data.Foldable.Singletons

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

Defined in Data.Foldable.Singletons

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

Defined in Data.Foldable.Singletons

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

Defined in Data.Traversable.Singletons

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

Defined in Data.Traversable.Singletons

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

Defined in Data.Proxy.Singletons

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

Defined in Data.Foldable.Singletons

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

Defined in Data.Foldable.Singletons

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

Defined in Data.Proxy.Singletons

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

Defined in Data.Proxy.Singletons

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

Defined in Data.Proxy.Singletons

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

Defined in Data.Proxy.Singletons

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

Defined in Data.Proxy.Singletons

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

Defined in Data.Proxy.Singletons

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

Defined in Data.Proxy.Singletons

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

Defined in Data.Proxy.Singletons

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

Defined in Data.Foldable.Singletons

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

Defined in Data.Proxy.Singletons

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

Defined in Data.Foldable.Singletons

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

Defined in Data.Foldable.Singletons

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

Defined in Data.Proxy.Singletons

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

Defined in Data.Proxy.Singletons

SuppressUnusedWarnings (ShowsPrec_6989586621680187870Sym0 :: TyFun Natural (Proxy s ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Proxy.Singletons

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

Defined in Data.Proxy.Singletons

SuppressUnusedWarnings (Fmap_6989586621680188051Sym1 a6989586621680188056 :: TyFun (Proxy a) (Proxy b) -> Type) 
Instance details

Defined in Data.Proxy.Singletons

SuppressUnusedWarnings (TFHelper_6989586621680188140Sym1 a6989586621680188145 :: TyFun (Proxy a) (Proxy b) -> Type) 
Instance details

Defined in Data.Proxy.Singletons

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

Defined in Data.Proxy.Singletons

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

Defined in Data.Foldable.Singletons

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

Defined in Data.Proxy.Singletons

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

Defined in Data.Proxy.Singletons

SuppressUnusedWarnings (Compare_6989586621680187827Sym1 a6989586621680187832 :: TyFun (Proxy s) Ordering -> Type) 
Instance details

Defined in Data.Proxy.Singletons

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

Defined in Data.Proxy.Singletons

SuppressUnusedWarnings (ShowsPrec_6989586621680187870Sym1 a6989586621680187878 :: TyFun (Proxy s) (Symbol ~> Symbol) -> Type) 
Instance details

Defined in Data.Proxy.Singletons

SuppressUnusedWarnings (TFHelper_6989586621680187753Sym1 a6989586621680187758 :: TyFun (Proxy s) Bool -> Type) 
Instance details

Defined in Data.Proxy.Singletons

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

Defined in Data.Proxy.Singletons

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

Defined in Data.Traversable.Singletons

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

Defined in Data.Traversable.Singletons

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

Defined in Data.Foldable.Singletons

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

Defined in Data.Foldable.Singletons

SuppressUnusedWarnings (Foldl_6989586621680209859Sym2 a6989586621680209865 a6989586621680209866 :: TyFun (Proxy a) b -> Type) 
Instance details

Defined in Data.Foldable.Singletons

SuppressUnusedWarnings (Foldr_6989586621680209846Sym2 a6989586621680209852 a6989586621680209853 :: TyFun (Proxy a) b -> Type) 
Instance details

Defined in Data.Foldable.Singletons

SuppressUnusedWarnings (Traverse_6989586621680497404Sym1 a6989586621680497409 :: TyFun (Proxy a) (f (Proxy b)) -> Type) 
Instance details

Defined in Data.Traversable.Singletons

SuppressUnusedWarnings (MapM_6989586621680497419Sym1 a6989586621680497424 :: TyFun (Proxy a) (m (Proxy b)) -> Type) 
Instance details

Defined in Data.Traversable.Singletons

SuppressUnusedWarnings (EnumFromThenTo_6989586621680187960Sym2 a6989586621680187966 a6989586621680187967 :: TyFun (Proxy s) [Proxy s] -> Type) 
Instance details

Defined in Data.Proxy.Singletons

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

Defined in Data.Proxy.Singletons

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

Defined in Data.Traversable.Singletons

type MapM (a2 :: a1 ~> m b) (a3 :: Proxy a1) = Apply (Apply (MapM_6989586621680497419Sym0 :: 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.Traversable.Singletons

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

Defined in Data.Proxy.Singletons

type LiftA2 (arg :: a ~> (b ~> c)) (arg1 :: Proxy a) (arg2 :: Proxy b) = Apply (Apply (Apply (LiftA2_6989586621679205019Sym0 :: TyFun (a ~> (b ~> c)) (Proxy a ~> (Proxy b ~> Proxy c)) -> Type) arg) arg1) arg2
type AllB (c :: k -> Constraint) (Proxy :: (k -> Type) -> Type) 
Instance details

Defined in Barbies.Internal.ConstraintsB

type AllB (c :: k -> Constraint) (Proxy :: (k -> Type) -> Type) = ()
type Fmap (a2 :: a1 ~> b) (a3 :: Proxy a1) 
Instance details

Defined in Data.Proxy.Singletons

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

Defined in Data.Foldable.Singletons

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

Defined in Data.Foldable.Singletons

type Foldl (a2 :: k2 ~> (a1 ~> k2)) (a3 :: k2) (a4 :: Proxy a1) = Apply (Apply (Apply (Foldl_6989586621680209859Sym0 :: TyFun (k2 ~> (a1 ~> 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.Foldable.Singletons

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

Defined in Data.Foldable.Singletons

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

Defined in Data.Foldable.Singletons

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

Since: base-4.6.0.0

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 Empty 
Instance details

Defined in Data.Proxy.Singletons

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

Defined in Data.Proxy.Singletons

type Mzero = Mzero_6989586621679205111Sym0 :: Proxy a
type Pure (a :: k1) 
Instance details

Defined in Data.Proxy.Singletons

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

Defined in Data.Proxy.Singletons

type Return (arg :: a) = Apply (Return_6989586621679205091Sym0 :: TyFun a (Proxy a) -> Type) arg
type Elem (a1 :: k1) (a2 :: Proxy k1) 
Instance details

Defined in Data.Foldable.Singletons

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

Defined in Data.Foldable.Singletons

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

Defined in Data.Foldable.Singletons

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

Defined in Data.Proxy.Singletons

type (arg :: a) <$ (arg1 :: Proxy b) = Apply (Apply (TFHelper_6989586621679204963Sym0 :: TyFun a (Proxy b ~> Proxy a) -> Type) arg) arg1
type (a2 :: Proxy a1) <|> (a3 :: Proxy a1) 
Instance details

Defined in Data.Proxy.Singletons

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

Defined in Data.Proxy.Singletons

type Mplus (arg :: Proxy a) (arg1 :: Proxy a) = Apply (Apply (Mplus_6989586621679205116Sym0 :: TyFun (Proxy a) (Proxy a ~> Proxy a) -> Type) arg) arg1
type Apply (Pure_6989586621680188119Sym0 :: TyFun a (Proxy a) -> Type) (a6989586621680188125 :: a) 
Instance details

Defined in Data.Proxy.Singletons

type Apply (Pure_6989586621680188119Sym0 :: TyFun a (Proxy a) -> Type) (a6989586621680188125 :: a) = Pure_6989586621680188119 a6989586621680188125
type Apply (Elem_6989586621680209901Sym0 :: TyFun a (Proxy a ~> Bool) -> Type) (a6989586621680209906 :: a) 
Instance details

Defined in Data.Foldable.Singletons

type Apply (Elem_6989586621680209901Sym0 :: TyFun a (Proxy a ~> Bool) -> Type) (a6989586621680209906 :: a) = Elem_6989586621680209901Sym1 a6989586621680209906
type Apply (ToEnum_6989586621680187946Sym0 :: TyFun Natural (Proxy s) -> Type) (a6989586621680187950 :: Natural) 
Instance details

Defined in Data.Proxy.Singletons

type Apply (ToEnum_6989586621680187946Sym0 :: TyFun Natural (Proxy s) -> Type) (a6989586621680187950 :: Natural) = ToEnum_6989586621680187946 a6989586621680187950 :: Proxy s
type Apply (ShowsPrec_6989586621680187870Sym0 :: TyFun Natural (Proxy s ~> (Symbol ~> Symbol)) -> Type) (a6989586621680187878 :: Natural) 
Instance details

Defined in Data.Proxy.Singletons

type Apply (ShowsPrec_6989586621680187870Sym0 :: TyFun Natural (Proxy s ~> (Symbol ~> Symbol)) -> Type) (a6989586621680187878 :: Natural) = ShowsPrec_6989586621680187870Sym1 a6989586621680187878 :: TyFun (Proxy s) (Symbol ~> Symbol) -> Type
type Apply (Foldl_6989586621680209859Sym1 a6989586621680209865 :: TyFun b (Proxy a ~> b) -> Type) (a6989586621680209866 :: b) 
Instance details

Defined in Data.Foldable.Singletons

type Apply (Foldl_6989586621680209859Sym1 a6989586621680209865 :: TyFun b (Proxy a ~> b) -> Type) (a6989586621680209866 :: b) = Foldl_6989586621680209859Sym2 a6989586621680209865 a6989586621680209866
type Apply (Foldr_6989586621680209846Sym1 a6989586621680209852 :: TyFun b (Proxy a ~> b) -> Type) (a6989586621680209853 :: b) 
Instance details

Defined in Data.Foldable.Singletons

type Apply (Foldr_6989586621680209846Sym1 a6989586621680209852 :: TyFun b (Proxy a ~> b) -> Type) (a6989586621680209853 :: b) = Foldr_6989586621680209846Sym2 a6989586621680209852 a6989586621680209853
type Rep (Proxy :: Type -> Type) 
Instance details

Defined in Data.Functor.Rep

type Rep (Proxy :: Type -> Type) = Void
type Fold (a :: Proxy k2) 
Instance details

Defined in Data.Foldable.Singletons

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

Defined in Data.Foldable.Singletons

type Length (a2 :: Proxy a1) = Apply (Length_6989586621680209888Sym0 :: TyFun (Proxy a1) Natural -> Type) a2
type Maximum (arg :: Proxy a) 
Instance details

Defined in Data.Foldable.Singletons

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

Defined in Data.Foldable.Singletons

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

Defined in Data.Foldable.Singletons

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

Defined in Data.Foldable.Singletons

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

Defined in Data.Foldable.Singletons

type Sum (a :: Proxy k2) = Apply (Sum_6989586621680209909Sym0 :: TyFun (Proxy k2) k2 -> Type) a
type ToList (arg :: Proxy a) 
Instance details

Defined in Data.Foldable.Singletons

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

Defined in Data.Traversable.Singletons

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

Defined in Data.Traversable.Singletons

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

Defined in Data.Proxy.Singletons

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

Defined in Data.Proxy.Singletons

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

Defined in Data.Proxy.Singletons

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

Defined in Data.Proxy.Singletons

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

Defined in Data.Proxy.Singletons

type (a2 :: Proxy a1) >>= (a3 :: a1 ~> Proxy b) = Apply (Apply (TFHelper_6989586621680188210Sym0 :: TyFun (Proxy a1) ((a1 ~> Proxy b) ~> Proxy b) -> Type) a2) a3
type Apply (Sconcat_6989586621680187995Sym0 :: TyFun (NonEmpty (Proxy s)) (Proxy s) -> Type) (a6989586621680187999 :: NonEmpty (Proxy s)) 
Instance details

Defined in Data.Proxy.Singletons

type Apply (Sconcat_6989586621680187995Sym0 :: TyFun (NonEmpty (Proxy s)) (Proxy s) -> Type) (a6989586621680187999 :: NonEmpty (Proxy s)) = Sconcat_6989586621680187995 a6989586621680187999
type Apply (Mconcat_6989586621680188004Sym0 :: TyFun [Proxy s] (Proxy s) -> Type) (a6989586621680188008 :: [Proxy s]) 
Instance details

Defined in Data.Proxy.Singletons

type Apply (Mconcat_6989586621680188004Sym0 :: TyFun [Proxy s] (Proxy s) -> Type) (a6989586621680188008 :: [Proxy s]) = Mconcat_6989586621680188004 a6989586621680188008
type Rep (Proxy t)

Since: base-4.6.0.0

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.Proxy.Singletons

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

Defined in Data.Proxy.Singletons

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

Defined in Data.Proxy.Singletons

type Mempty = Mempty_6989586621680188000Sym0 :: Proxy s
type MaxBound 
Instance details

Defined in Data.Proxy.Singletons

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

Defined in Data.Proxy.Singletons

type MinBound = MinBound_6989586621680187559Sym0 :: Proxy s
type Mconcat (a :: [Proxy s]) 
Instance details

Defined in Data.Proxy.Singletons

type Mconcat (a :: [Proxy s]) = Apply (Mconcat_6989586621680188004Sym0 :: TyFun [Proxy s] (Proxy s) -> Type) a
type Sconcat (a :: NonEmpty (Proxy s)) 
Instance details

Defined in Data.Proxy.Singletons

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

Defined in Data.Proxy.Singletons

type FromEnum (a :: Proxy s) = Apply (FromEnum_6989586621680187940Sym0 :: TyFun (Proxy s) Natural -> Type) a
type Pred (a :: Proxy s) 
Instance details

Defined in Data.Proxy.Singletons

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

Defined in Data.Proxy.Singletons

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

Defined in Data.Proxy.Singletons

type ToEnum a = Apply (ToEnum_6989586621680187946Sym0 :: TyFun Natural (Proxy s) -> Type) a
type Show_ (arg :: Proxy s) 
Instance details

Defined in Data.Proxy.Singletons

type Show_ (arg :: Proxy s) = Apply (Show__6989586621680010043Sym0 :: TyFun (Proxy s) Symbol -> Type) arg
type (arg :: Proxy s) /= (arg1 :: Proxy s) 
Instance details

Defined in Data.Proxy.Singletons

type (arg :: Proxy s) /= (arg1 :: Proxy s) = Apply (Apply (TFHelper_6989586621679136966Sym0 :: TyFun (Proxy s) (Proxy s ~> Bool) -> Type) arg) arg1
type (a1 :: Proxy s) == (a2 :: Proxy s) 
Instance details

Defined in Data.Proxy.Singletons

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

Defined in Data.Proxy.Singletons

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

Defined in Data.Proxy.Singletons

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

Defined in Data.Proxy.Singletons

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

Defined in Data.Proxy.Singletons

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

Defined in Data.Proxy.Singletons

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

Defined in Data.Proxy.Singletons

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

Defined in Data.Proxy.Singletons

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

Defined in Data.Proxy.Singletons

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

Defined in Data.Proxy.Singletons

type (a1 :: Proxy s) <> (a2 :: Proxy s) = Apply (Apply (TFHelper_6989586621680187987Sym0 :: TyFun (Proxy s) (Proxy s ~> Proxy s) -> Type) a1) a2
type EnumFromTo (a1 :: Proxy s) (a2 :: Proxy s) 
Instance details

Defined in Data.Proxy.Singletons

type EnumFromTo (a1 :: Proxy s) (a2 :: Proxy s) = Apply (Apply (EnumFromTo_6989586621680187971Sym0 :: TyFun (Proxy s) (Proxy s ~> [Proxy s]) -> Type) a1) a2
type ShowList (arg :: [Proxy s]) arg1 
Instance details

Defined in Data.Proxy.Singletons

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

Defined in Data.Proxy.Singletons

type EnumFromThenTo (a1 :: Proxy s) (a2 :: Proxy s) (a3 :: Proxy s) = Apply (Apply (Apply (EnumFromThenTo_6989586621680187960Sym0 :: 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.Proxy.Singletons

type ShowsPrec a1 (a2 :: Proxy s) a3 = Apply (Apply (Apply (ShowsPrec_6989586621680187870Sym0 :: TyFun Natural (Proxy s ~> (Symbol ~> Symbol)) -> Type) a1) a2) a3
type Apply (Product_6989586621680209915Sym0 :: TyFun (Proxy a) a -> Type) (a6989586621680209919 :: Proxy a) 
Instance details

Defined in Data.Foldable.Singletons

type Apply (Product_6989586621680209915Sym0 :: TyFun (Proxy a) a -> Type) (a6989586621680209919 :: Proxy a) = Product_6989586621680209915 a6989586621680209919
type Apply (Sum_6989586621680209909Sym0 :: TyFun (Proxy a) a -> Type) (a6989586621680209913 :: Proxy a) 
Instance details

Defined in Data.Foldable.Singletons

type Apply (Sum_6989586621680209909Sym0 :: TyFun (Proxy a) a -> Type) (a6989586621680209913 :: Proxy a) = Sum_6989586621680209909 a6989586621680209913
type Apply (Fold_6989586621680209838Sym0 :: TyFun (Proxy m) m -> Type) (a6989586621680209842 :: Proxy m) 
Instance details

Defined in Data.Foldable.Singletons

type Apply (Fold_6989586621680209838Sym0 :: TyFun (Proxy m) m -> Type) (a6989586621680209842 :: Proxy m) = Fold_6989586621680209838 a6989586621680209842
type Apply (Elem_6989586621680209901Sym1 a6989586621680209906 :: TyFun (Proxy a) Bool -> Type) (a6989586621680209907 :: Proxy a) 
Instance details

Defined in Data.Foldable.Singletons

type Apply (Elem_6989586621680209901Sym1 a6989586621680209906 :: TyFun (Proxy a) Bool -> Type) (a6989586621680209907 :: Proxy a) = Elem_6989586621680209901 a6989586621680209906 a6989586621680209907
type Apply (Foldl1_6989586621680209871Sym1 a6989586621680209876 :: TyFun (Proxy a) a -> Type) (a6989586621680209877 :: Proxy a) 
Instance details

Defined in Data.Foldable.Singletons

type Apply (Foldl1_6989586621680209871Sym1 a6989586621680209876 :: TyFun (Proxy a) a -> Type) (a6989586621680209877 :: Proxy a) = Foldl1_6989586621680209871 a6989586621680209876 a6989586621680209877
type Apply (Foldr1_6989586621680209880Sym1 a6989586621680209885 :: TyFun (Proxy a) a -> Type) (a6989586621680209886 :: Proxy a) 
Instance details

Defined in Data.Foldable.Singletons

type Apply (Foldr1_6989586621680209880Sym1 a6989586621680209885 :: TyFun (Proxy a) a -> Type) (a6989586621680209886 :: Proxy a) = Foldr1_6989586621680209880 a6989586621680209885 a6989586621680209886
type Apply (Length_6989586621680209888Sym0 :: TyFun (Proxy a) Natural -> Type) (a6989586621680209892 :: Proxy a) 
Instance details

Defined in Data.Foldable.Singletons

type Apply (Length_6989586621680209888Sym0 :: TyFun (Proxy a) Natural -> Type) (a6989586621680209892 :: Proxy a) = Length_6989586621680209888 a6989586621680209892
type Apply (Null_6989586621680209894Sym0 :: TyFun (Proxy a) Bool -> Type) (a6989586621680209898 :: Proxy a) 
Instance details

Defined in Data.Foldable.Singletons

type Apply (Null_6989586621680209894Sym0 :: TyFun (Proxy a) Bool -> Type) (a6989586621680209898 :: Proxy a) = Null_6989586621680209894 a6989586621680209898
type Apply (FromEnum_6989586621680187940Sym0 :: TyFun (Proxy s) Natural -> Type) (a6989586621680187944 :: Proxy s) 
Instance details

Defined in Data.Proxy.Singletons

type Apply (FromEnum_6989586621680187940Sym0 :: TyFun (Proxy s) Natural -> Type) (a6989586621680187944 :: Proxy s) = FromEnum_6989586621680187940 a6989586621680187944
type Apply (FoldMap_6989586621680209830Sym1 a6989586621680209835 :: TyFun (Proxy a) m -> Type) (a6989586621680209836 :: Proxy a) 
Instance details

Defined in Data.Foldable.Singletons

type Apply (FoldMap_6989586621680209830Sym1 a6989586621680209835 :: TyFun (Proxy a) m -> Type) (a6989586621680209836 :: Proxy a) = FoldMap_6989586621680209830 a6989586621680209835 a6989586621680209836
type Apply (Compare_6989586621680187827Sym1 a6989586621680187832 :: TyFun (Proxy s) Ordering -> Type) (a6989586621680187833 :: Proxy s) 
Instance details

Defined in Data.Proxy.Singletons

type Apply (Compare_6989586621680187827Sym1 a6989586621680187832 :: TyFun (Proxy s) Ordering -> Type) (a6989586621680187833 :: Proxy s) = Compare_6989586621680187827 a6989586621680187832 a6989586621680187833
type Apply (TFHelper_6989586621680187753Sym1 a6989586621680187758 :: TyFun (Proxy s) Bool -> Type) (a6989586621680187759 :: Proxy s) 
Instance details

Defined in Data.Proxy.Singletons

type Apply (TFHelper_6989586621680187753Sym1 a6989586621680187758 :: TyFun (Proxy s) Bool -> Type) (a6989586621680187759 :: Proxy s) = TFHelper_6989586621680187753 a6989586621680187758 a6989586621680187759
type Apply (Foldl_6989586621680209859Sym2 a6989586621680209865 a6989586621680209866 :: TyFun (Proxy a) b -> Type) (a6989586621680209867 :: Proxy a) 
Instance details

Defined in Data.Foldable.Singletons

type Apply (Foldl_6989586621680209859Sym2 a6989586621680209865 a6989586621680209866 :: TyFun (Proxy a) b -> Type) (a6989586621680209867 :: Proxy a) = Foldl_6989586621680209859 a6989586621680209865 a6989586621680209866 a6989586621680209867
type Apply (Foldr_6989586621680209846Sym2 a6989586621680209852 a6989586621680209853 :: TyFun (Proxy a) b -> Type) (a6989586621680209854 :: Proxy a) 
Instance details

Defined in Data.Foldable.Singletons

type Apply (Foldr_6989586621680209846Sym2 a6989586621680209852 a6989586621680209853 :: TyFun (Proxy a) b -> Type) (a6989586621680209854 :: Proxy a) = Foldr_6989586621680209846 a6989586621680209852 a6989586621680209853 a6989586621680209854
type Apply (SequenceA_6989586621680497412Sym0 :: TyFun (Proxy (f a)) (f (Proxy a)) -> Type) (a6989586621680497416 :: Proxy (f a)) 
Instance details

Defined in Data.Traversable.Singletons

type Apply (SequenceA_6989586621680497412Sym0 :: TyFun (Proxy (f a)) (f (Proxy a)) -> Type) (a6989586621680497416 :: Proxy (f a)) = SequenceA_6989586621680497412 a6989586621680497416
type Apply (Sequence_6989586621680497427Sym0 :: TyFun (Proxy (m a)) (m (Proxy a)) -> Type) (a6989586621680497431 :: Proxy (m a)) 
Instance details

Defined in Data.Traversable.Singletons

type Apply (Sequence_6989586621680497427Sym0 :: TyFun (Proxy (m a)) (m (Proxy a)) -> Type) (a6989586621680497431 :: Proxy (m a)) = Sequence_6989586621680497427 a6989586621680497431
type Apply (EnumFromTo_6989586621680187971Sym1 a6989586621680187976 :: TyFun (Proxy s) [Proxy s] -> Type) (a6989586621680187977 :: Proxy s) 
Instance details

Defined in Data.Proxy.Singletons

type Apply (EnumFromTo_6989586621680187971Sym1 a6989586621680187976 :: TyFun (Proxy s) [Proxy s] -> Type) (a6989586621680187977 :: Proxy s) = EnumFromTo_6989586621680187971 a6989586621680187976 a6989586621680187977
type Apply (Traverse_6989586621680497404Sym1 a6989586621680497409 :: TyFun (Proxy a) (f (Proxy b)) -> Type) (a6989586621680497410 :: Proxy a) 
Instance details

Defined in Data.Traversable.Singletons

type Apply (Traverse_6989586621680497404Sym1 a6989586621680497409 :: TyFun (Proxy a) (f (Proxy b)) -> Type) (a6989586621680497410 :: Proxy a) = Traverse_6989586621680497404 a6989586621680497409 a6989586621680497410
type Apply (MapM_6989586621680497419Sym1 a6989586621680497424 :: TyFun (Proxy a) (m (Proxy b)) -> Type) (a6989586621680497425 :: Proxy a) 
Instance details

Defined in Data.Traversable.Singletons

type Apply (MapM_6989586621680497419Sym1 a6989586621680497424 :: TyFun (Proxy a) (m (Proxy b)) -> Type) (a6989586621680497425 :: Proxy a) = MapM_6989586621680497419 a6989586621680497424 a6989586621680497425
type Apply (EnumFromThenTo_6989586621680187960Sym2 a6989586621680187966 a6989586621680187967 :: TyFun (Proxy s) [Proxy s] -> Type) (a6989586621680187968 :: Proxy s) 
Instance details

Defined in Data.Proxy.Singletons

type Apply (EnumFromThenTo_6989586621680187960Sym2 a6989586621680187966 a6989586621680187967 :: TyFun (Proxy s) [Proxy s] -> Type) (a6989586621680187968 :: Proxy s) = EnumFromThenTo_6989586621680187960 a6989586621680187966 a6989586621680187967 a6989586621680187968
type Apply (Foldl1_6989586621680209871Sym0 :: TyFun (a ~> (a ~> a)) (Proxy a ~> a) -> Type) (a6989586621680209876 :: a ~> (a ~> a)) 
Instance details

Defined in Data.Foldable.Singletons

type Apply (Foldl1_6989586621680209871Sym0 :: TyFun (a ~> (a ~> a)) (Proxy a ~> a) -> Type) (a6989586621680209876 :: a ~> (a ~> a)) = Foldl1_6989586621680209871Sym1 a6989586621680209876
type Apply (Foldr1_6989586621680209880Sym0 :: TyFun (a ~> (a ~> a)) (Proxy a ~> a) -> Type) (a6989586621680209885 :: a ~> (a ~> a)) 
Instance details

Defined in Data.Foldable.Singletons

type Apply (Foldr1_6989586621680209880Sym0 :: TyFun (a ~> (a ~> a)) (Proxy a ~> a) -> Type) (a6989586621680209885 :: a ~> (a ~> a)) = Foldr1_6989586621680209880Sym1 a6989586621680209885
type Apply (TFHelper_6989586621680188140Sym0 :: TyFun (Proxy (a ~> b)) (Proxy a ~> Proxy b) -> Type) (a6989586621680188145 :: Proxy (a ~> b)) 
Instance details

Defined in Data.Proxy.Singletons

type Apply (TFHelper_6989586621680188140Sym0 :: TyFun (Proxy (a ~> b)) (Proxy a ~> Proxy b) -> Type) (a6989586621680188145 :: Proxy (a ~> b)) = TFHelper_6989586621680188140Sym1 a6989586621680188145
type Apply (TFHelper_6989586621680188164Sym0 :: TyFun (Proxy a) (Proxy a ~> Proxy a) -> Type) (a6989586621680188169 :: Proxy a) 
Instance details

Defined in Data.Proxy.Singletons

type Apply (TFHelper_6989586621680188164Sym0 :: TyFun (Proxy a) (Proxy a ~> Proxy a) -> Type) (a6989586621680188169 :: Proxy a) = TFHelper_6989586621680188164Sym1 a6989586621680188169
type Apply (Pred_6989586621680187934Sym0 :: TyFun (Proxy s) (Proxy s) -> Type) (a6989586621680187938 :: Proxy s) 
Instance details

Defined in Data.Proxy.Singletons

type Apply (Pred_6989586621680187934Sym0 :: TyFun (Proxy s) (Proxy s) -> Type) (a6989586621680187938 :: Proxy s) = Pred_6989586621680187934 a6989586621680187938
type Apply (Succ_6989586621680187928Sym0 :: TyFun (Proxy s) (Proxy s) -> Type) (a6989586621680187932 :: Proxy s) 
Instance details

Defined in Data.Proxy.Singletons

type Apply (Succ_6989586621680187928Sym0 :: TyFun (Proxy s) (Proxy s) -> Type) (a6989586621680187932 :: Proxy s) = Succ_6989586621680187928 a6989586621680187932
type Apply (TFHelper_6989586621680187987Sym0 :: TyFun (Proxy s) (Proxy s ~> Proxy s) -> Type) (a6989586621680187992 :: Proxy s) 
Instance details

Defined in Data.Proxy.Singletons

type Apply (TFHelper_6989586621680187987Sym0 :: TyFun (Proxy s) (Proxy s ~> Proxy s) -> Type) (a6989586621680187992 :: Proxy s) = TFHelper_6989586621680187987Sym1 a6989586621680187992
type Apply (Compare_6989586621680187827Sym0 :: TyFun (Proxy s) (Proxy s ~> Ordering) -> Type) (a6989586621680187832 :: Proxy s) 
Instance details

Defined in Data.Proxy.Singletons

type Apply (Compare_6989586621680187827Sym0 :: TyFun (Proxy s) (Proxy s ~> Ordering) -> Type) (a6989586621680187832 :: Proxy s) = Compare_6989586621680187827Sym1 a6989586621680187832
type Apply (EnumFromThenTo_6989586621680187960Sym0 :: TyFun (Proxy s) (Proxy s ~> (Proxy s ~> [Proxy s])) -> Type) (a6989586621680187966 :: Proxy s) 
Instance details

Defined in Data.Proxy.Singletons

type Apply (EnumFromThenTo_6989586621680187960Sym0 :: TyFun (Proxy s) (Proxy s ~> (Proxy s ~> [Proxy s])) -> Type) (a6989586621680187966 :: Proxy s) = EnumFromThenTo_6989586621680187960Sym1 a6989586621680187966
type Apply (TFHelper_6989586621680187753Sym0 :: TyFun (Proxy s) (Proxy s ~> Bool) -> Type) (a6989586621680187758 :: Proxy s) 
Instance details

Defined in Data.Proxy.Singletons

type Apply (TFHelper_6989586621680187753Sym0 :: TyFun (Proxy s) (Proxy s ~> Bool) -> Type) (a6989586621680187758 :: Proxy s) = TFHelper_6989586621680187753Sym1 a6989586621680187758
type Apply (EnumFromTo_6989586621680187971Sym0 :: TyFun (Proxy s) (Proxy s ~> [Proxy s]) -> Type) (a6989586621680187976 :: Proxy s) 
Instance details

Defined in Data.Proxy.Singletons

type Apply (EnumFromTo_6989586621680187971Sym0 :: TyFun (Proxy s) (Proxy s ~> [Proxy s]) -> Type) (a6989586621680187976 :: Proxy s) = EnumFromTo_6989586621680187971Sym1 a6989586621680187976
type Apply (Foldr_6989586621680209846Sym0 :: TyFun (a ~> (b ~> b)) (b ~> (Proxy a ~> b)) -> Type) (a6989586621680209852 :: a ~> (b ~> b)) 
Instance details

Defined in Data.Foldable.Singletons

type Apply (Foldr_6989586621680209846Sym0 :: TyFun (a ~> (b ~> b)) (b ~> (Proxy a ~> b)) -> Type) (a6989586621680209852 :: a ~> (b ~> b)) = Foldr_6989586621680209846Sym1 a6989586621680209852
type Apply (Fmap_6989586621680188051Sym0 :: TyFun (a ~> b) (Proxy a ~> Proxy b) -> Type) (a6989586621680188056 :: a ~> b) 
Instance details

Defined in Data.Proxy.Singletons

type Apply (Fmap_6989586621680188051Sym0 :: TyFun (a ~> b) (Proxy a ~> Proxy b) -> Type) (a6989586621680188056 :: a ~> b) = Fmap_6989586621680188051Sym1 a6989586621680188056
type Apply (FoldMap_6989586621680209830Sym0 :: TyFun (a ~> m) (Proxy a ~> m) -> Type) (a6989586621680209835 :: a ~> m) 
Instance details

Defined in Data.Foldable.Singletons

type Apply (FoldMap_6989586621680209830Sym0 :: TyFun (a ~> m) (Proxy a ~> m) -> Type) (a6989586621680209835 :: a ~> m) = FoldMap_6989586621680209830Sym1 a6989586621680209835
type Apply (Foldl_6989586621680209859Sym0 :: TyFun (b ~> (a ~> b)) (b ~> (Proxy a ~> b)) -> Type) (a6989586621680209865 :: b ~> (a ~> b)) 
Instance details

Defined in Data.Foldable.Singletons

type Apply (Foldl_6989586621680209859Sym0 :: TyFun (b ~> (a ~> b)) (b ~> (Proxy a ~> b)) -> Type) (a6989586621680209865 :: b ~> (a ~> b)) = Foldl_6989586621680209859Sym1 a6989586621680209865
type Apply (Fmap_6989586621680188051Sym1 a6989586621680188056 :: TyFun (Proxy a) (Proxy b) -> Type) (a6989586621680188057 :: Proxy a) 
Instance details

Defined in Data.Proxy.Singletons

type Apply (Fmap_6989586621680188051Sym1 a6989586621680188056 :: TyFun (Proxy a) (Proxy b) -> Type) (a6989586621680188057 :: Proxy a) = Fmap_6989586621680188051 a6989586621680188056 a6989586621680188057
type Apply (TFHelper_6989586621680188140Sym1 a6989586621680188145 :: TyFun (Proxy a) (Proxy b) -> Type) (a6989586621680188146 :: Proxy a) 
Instance details

Defined in Data.Proxy.Singletons

type Apply (TFHelper_6989586621680188140Sym1 a6989586621680188145 :: TyFun (Proxy a) (Proxy b) -> Type) (a6989586621680188146 :: Proxy a) = TFHelper_6989586621680188140 a6989586621680188145 a6989586621680188146
type Apply (TFHelper_6989586621680188210Sym0 :: TyFun (Proxy a) ((a ~> Proxy b) ~> Proxy b) -> Type) (a6989586621680188215 :: Proxy a) 
Instance details

Defined in Data.Proxy.Singletons

type Apply (TFHelper_6989586621680188210Sym0 :: TyFun (Proxy a) ((a ~> Proxy b) ~> Proxy b) -> Type) (a6989586621680188215 :: Proxy a) = TFHelper_6989586621680188210Sym1 a6989586621680188215 :: TyFun (a ~> Proxy b) (Proxy b) -> Type
type Apply (TFHelper_6989586621680188164Sym1 a6989586621680188169 :: TyFun (Proxy a) (Proxy a) -> Type) (a6989586621680188170 :: Proxy a) 
Instance details

Defined in Data.Proxy.Singletons

type Apply (TFHelper_6989586621680188164Sym1 a6989586621680188169 :: TyFun (Proxy a) (Proxy a) -> Type) (a6989586621680188170 :: Proxy a) = TFHelper_6989586621680188164 a6989586621680188169 a6989586621680188170
type Apply (TFHelper_6989586621680187987Sym1 a6989586621680187992 :: TyFun (Proxy s) (Proxy s) -> Type) (a6989586621680187993 :: Proxy s) 
Instance details

Defined in Data.Proxy.Singletons

type Apply (TFHelper_6989586621680187987Sym1 a6989586621680187992 :: TyFun (Proxy s) (Proxy s) -> Type) (a6989586621680187993 :: Proxy s) = TFHelper_6989586621680187987 a6989586621680187992 a6989586621680187993
type Apply (EnumFromThenTo_6989586621680187960Sym1 a6989586621680187966 :: TyFun (Proxy s) (Proxy s ~> [Proxy s]) -> Type) (a6989586621680187967 :: Proxy s) 
Instance details

Defined in Data.Proxy.Singletons

type Apply (EnumFromThenTo_6989586621680187960Sym1 a6989586621680187966 :: TyFun (Proxy s) (Proxy s ~> [Proxy s]) -> Type) (a6989586621680187967 :: Proxy s) = EnumFromThenTo_6989586621680187960Sym2 a6989586621680187966 a6989586621680187967
type Apply (ShowsPrec_6989586621680187870Sym1 a6989586621680187878 :: TyFun (Proxy s) (Symbol ~> Symbol) -> Type) (a6989586621680187879 :: Proxy s) 
Instance details

Defined in Data.Proxy.Singletons

type Apply (ShowsPrec_6989586621680187870Sym1 a6989586621680187878 :: TyFun (Proxy s) (Symbol ~> Symbol) -> Type) (a6989586621680187879 :: Proxy s) = ShowsPrec_6989586621680187870Sym2 a6989586621680187878 a6989586621680187879
type Apply (Traverse_6989586621680497404Sym0 :: TyFun (a ~> f b) (Proxy a ~> f (Proxy b)) -> Type) (a6989586621680497409 :: a ~> f b) 
Instance details

Defined in Data.Traversable.Singletons

type Apply (Traverse_6989586621680497404Sym0 :: TyFun (a ~> f b) (Proxy a ~> f (Proxy b)) -> Type) (a6989586621680497409 :: a ~> f b) = Traverse_6989586621680497404Sym1 a6989586621680497409
type Apply (MapM_6989586621680497419Sym0 :: TyFun (a ~> m b) (Proxy a ~> m (Proxy b)) -> Type) (a6989586621680497424 :: a ~> m b) 
Instance details

Defined in Data.Traversable.Singletons

type Apply (MapM_6989586621680497419Sym0 :: TyFun (a ~> m b) (Proxy a ~> m (Proxy b)) -> Type) (a6989586621680497424 :: a ~> m b) = MapM_6989586621680497419Sym1 a6989586621680497424
type Apply (TFHelper_6989586621680188210Sym1 a6989586621680188215 :: TyFun (a ~> Proxy b) (Proxy b) -> Type) (a6989586621680188216 :: a ~> Proxy b) 
Instance details

Defined in Data.Proxy.Singletons

type Apply (TFHelper_6989586621680188210Sym1 a6989586621680188215 :: TyFun (a ~> Proxy b) (Proxy b) -> Type) (a6989586621680188216 :: a ~> Proxy b) = TFHelper_6989586621680188210 a6989586621680188215 a6989586621680188216

type family (a :: Bool) || (b :: Bool) :: Bool where ... infixr 2 Source #

Type-level "or"

Equations

'False || a = a 
'True || a = 'True 
a || 'False = a 
a || 'True = 'True 
a || a = a 

type family If (cond :: Bool) (tru :: k) (fls :: k) :: k where ... Source #

Type-level If. If True a b ==> a; If False a b ==> b

Equations

If 'True (tru :: k) (fls :: k) = tru 
If 'False (tru :: k) (fls :: k) = fls 

type family TypeError (a :: ErrorMessage) :: b where ... Source #

The type-level equivalent of error.

The polymorphic kind of this type allows it to be used in several settings. For instance, it can be used as a constraint, e.g. to provide a better error message for a non-existent instance,

-- in a context
instance TypeError (Text "Cannot Show functions." :$$:
                    Text "Perhaps there is a missing argument?")
      => Show (a -> b) where
    showsPrec = error "unreachable"

It can also be placed on the right-hand side of a type-level function to provide an error for an invalid case,

type family ByteSize x where
   ByteSize Word16   = 2
   ByteSize Word8    = 1
   ByteSize a        = TypeError (Text "The type " :<>: ShowType a :<>:
                                  Text " is not exportable.")

Since: base-4.9.0.0

type family (a :: Natural) + (b :: Natural) :: Natural where ... infixl 6 Source #

Addition of type-level naturals.

Since: base-4.7.0.0

type family (a :: Natural) * (b :: Natural) :: Natural where ... infixl 7 Source #

Multiplication of type-level naturals.

Since: base-4.7.0.0

type family CmpNat (a :: Natural) (b :: Natural) :: Ordering where ... Source #

Comparison of type-level naturals, as a function.

Since: base-4.7.0.0

data ErrorMessage Source #

A description of a custom type error.

Constructors

Text Symbol

Show the text as is.

ShowType t

Pretty print the type. ShowType :: k -> ErrorMessage

ErrorMessage :<>: ErrorMessage infixl 6

Put two pieces of error message next to each other.

ErrorMessage :$$: ErrorMessage infixl 5

Stack two pieces of error message on top of each other.

type Nat = Natural Source #

A type synonym for Natural.

Prevously, this was an opaque data type, but it was changed to a type synonym.

Since: base-4.16.0.0

data SList (a1 :: [a]) where Source #

Constructors

SNil :: forall a. SList ('[] :: [a]) 
SCons :: forall a (n1 :: a) (n2 :: [a]). Sing n1 -> Sing n2 -> SList (n1 ': n2) infixr 5 

Instances

Instances details
(SDecide a, SDecide [a]) => TestCoercion (SList :: [a] -> Type) 
Instance details

Defined in Data.Singletons.Base.Instances

Methods

testCoercion :: forall (a0 :: k) (b :: k). SList a0 -> SList b -> Maybe (Coercion a0 b) Source #

(SDecide a, SDecide [a]) => TestEquality (SList :: [a] -> Type) 
Instance details

Defined in Data.Singletons.Base.Instances

Methods

testEquality :: forall (a0 :: k) (b :: k). SList a0 -> SList b -> Maybe (a0 :~: b) Source #

(ShowSing a, ShowSing [a]) => Show (SList z) 
Instance details

Defined in Data.Singletons.Base.Instances

data IsChecked a Source #

Constructors

Checked a 
Unchecked a 

Instances

Instances details
Functor IsChecked Source # 
Instance details

Defined in Torch.GraduallyTyped.Prelude

Methods

fmap :: (a -> b) -> IsChecked a -> IsChecked b Source #

(<$) :: a -> IsChecked b -> IsChecked a Source #

Generic (IsChecked a) Source # 
Instance details

Defined in Torch.GraduallyTyped.Prelude

Associated Types

type Rep (IsChecked a) :: Type -> Type Source #

Methods

from :: IsChecked a -> Rep (IsChecked a) x Source #

to :: Rep (IsChecked a) x -> IsChecked a Source #

Show a => Show (IsChecked a) Source # 
Instance details

Defined in Torch.GraduallyTyped.Prelude

Eq a => Eq (IsChecked a) Source # 
Instance details

Defined in Torch.GraduallyTyped.Prelude

Ord a => Ord (IsChecked a) Source # 
Instance details

Defined in Torch.GraduallyTyped.Prelude

type Rep (IsChecked a) Source # 
Instance details

Defined in Torch.GraduallyTyped.Prelude

type Rep (IsChecked a) = D1 ('MetaData "IsChecked" "Torch.GraduallyTyped.Prelude" "hasktorch-gradually-typed-0.2.0.0-1KV1aIPzzbp6JpSr37tC1K" 'False) (C1 ('MetaCons "Checked" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a)) :+: C1 ('MetaCons "Unchecked" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a)))

pattern IsChecked :: a -> IsChecked a Source #

pattern Demoted :: SingKind k => Demote k -> Sing (a :: k) Source #

pattern Demoted' :: (SingKind k, Demote k ~ IsChecked t) => t -> Sing (a :: k) Source #

pattern (:|:) :: forall a as. Sing a -> SList as -> SList (a ': as) infixr 8 Source #

type family All (c :: k -> Constraint) (xs :: [k]) :: Constraint where ... Source #

Equations

All _ '[] = () 
All c (h ': t) = (c h, All c t) 

class KnownElem k x where Source #

Associated Types

type ElemValF k :: Type Source #

Methods

elemVal :: ElemValF k Source #

class KnownList k (xs :: [k]) where Source #

Methods

listVal :: [ElemValF k] Source #

Instances

Instances details
KnownList k ('[] :: [k]) Source # 
Instance details

Defined in Torch.GraduallyTyped.Prelude

Methods

listVal :: [ElemValF k] Source #

(KnownElem k x, KnownList k xs) => KnownList k (x ': xs :: [k]) Source # 
Instance details

Defined in Torch.GraduallyTyped.Prelude

Methods

listVal :: [ElemValF k] Source #

type family Assert err a where ... Source #

Can be used to report stuck type families, see https://kcsongor.github.io/report-stuck-families/. This family is able to check whether its argument a is stuck and report an error err in that case.

Equations

Assert _ T = Any 
Assert _ a = a 

type family Catch a where ... Source #

Approximates a normal form on the type level. Catch forces its argument a and returns an empty Constraint if and only if the argument does not produce a TypeError.

The first equation will recursively force the kind of the argument until it reaches Type or a TypeError. In the former case, it falls over to the second equation which will produce the empty constraint. In the latter case, it gets stuck with 'Catch (TypeError ...)', and the compiler will report the error message.

Thanks to https://kcsongor.github.io/kcsongor for the suggestion.

Equations

Catch (f a) = (Catch f, Catch a) 
Catch _ = () 

type family Seq (a :: k) (b :: k') :: k' where ... Source #

Equations

Seq (f a) b = Seq (Seq f a) b 
Seq _ b = b 

type family Fst (t :: (k, k')) :: k where ... Source #

Returns the first element of a type-level tuple with the kind (k, k') marked by a prefix quote.

>>> :kind! Fst '(Int, String)
Fst '(Int, String) :: *
= Int
>>> :kind! Fst '(Functor, String)
Fst '(Functor, String) :: (* -> *) -> Constraint
= Functor

Equations

Fst '(x, _) = x 

type family Snd (t :: (k, k')) :: k' where ... Source #

Returns the second element of a type-level tuple with the kind (k, k') marked by a prefix quote.

>>> :kind! Snd '(Int, String)
Snd '(Int, String) :: *
= [Char]
>>> :kind! Snd '(Int, Monad)
Snd '(Int, Monad) :: (* -> *) -> Constraint
= Monad

Equations

Snd '(_, y) = y 

type family Elem (e :: t) (es :: [t]) :: Bool where ... Source #

Check that a given type is an element of a type-level list:

>>> :kind! Elem String '[]
Elem String '[] :: Bool
= 'False
>>> :kind! Elem String '[Int, String]
Elem String '[Int, String] :: Bool
= 'True
>>> :kind! Elem String '[Int, Bool]
Elem String '[Int, Bool] :: Bool
= 'False

Equations

Elem _ '[] = 'False 
Elem x (x ': _) = 'True 
Elem x (_ ': xs) = Elem x xs 

type family Head (xs :: [a]) :: Maybe a where ... Source #

Equations

Head '[] = 'Nothing 
Head (x ': _) = 'Just x 

type family Tail (xs :: [a]) :: Maybe [a] where ... Source #

Equations

Tail '[] = 'Nothing 
Tail (_ ': xs) = 'Just xs 

type family Length (xs :: [a]) :: Nat where ... Source #

Equations

Length '[] = 0 
Length (_ ': xs) = 1 + Length xs 

type family Contains (f :: k) (a :: k') :: Bool where ... Source #

Test whether or not a given type contains another:

>>> :kind! Contains (Either Int String) Int
Contains (Either Int String) Int :: Bool
= 'True
>>> :kind! Contains (Either Int String) Bool
Contains (Either Int String) Bool :: Bool
= 'False
>>> :kind! Contains (Either Int String) Either
Contains (Either Int String) Either :: Bool
= 'True

Equations

Contains a a = 'True 
Contains (f g) a = Contains f a || Contains g a 
Contains _ _ = 'False 

type family Extract (f :: k) (a :: k') :: [k'] where ... Source #

Extract all occurrences of a given type from another:

>>> :kind! Extract (Either Int String) Int
Extract (Either Int String) Int :: [*]
= '[Int]
>>> :kind! Extract (Either Int String) Bool
Extract (Either Int String) Bool :: [*]
= '[]
>>> :kind! Extract (Either Int String) Either
Extract (Either Int String) Either :: [* -> * -> *]
= '[Either]

Equations

Extract a a = '[a] 
Extract (f g) a = Concat (Extract f a) (Extract g a) 
Extract _ _ = '[] 

type family FromMaybe (d :: k) (x :: Maybe k) :: k where ... Source #

Equations

FromMaybe d 'Nothing = d 
FromMaybe _ ('Just v) = v 

type family MaybeF (d :: k') (f :: k -> k') (x :: Maybe k) :: k' where ... Source #

Equations

MaybeF d _ 'Nothing = d 
MaybeF _ f ('Just v) = f v 

type family FstMaybe (t :: Maybe (k, k')) :: Maybe k where ... Source #

Equations

FstMaybe 'Nothing = 'Nothing 
FstMaybe ('Just '(x, _)) = 'Just x 

type family SndMaybe (t :: Maybe (k, k')) :: Maybe k' where ... Source #

Equations

SndMaybe 'Nothing = 'Nothing 
SndMaybe ('Just '(_, y)) = 'Just y 

type family PrependMaybe (h :: Maybe a) (t :: Maybe [a]) :: Maybe [a] where ... Source #

Equations

PrependMaybe 'Nothing _ = 'Nothing 
PrependMaybe _ 'Nothing = 'Nothing 
PrependMaybe ('Just h) ('Just t) = 'Just (h ': t) 

type family MapMaybe (f :: k -> k') (a :: Maybe k) :: Maybe k' where ... Source #

Equations

MapMaybe _ 'Nothing = 'Nothing 
MapMaybe f ('Just k) = 'Just (f k) 

type family BindMaybe (f :: k -> Maybe k') (a :: Maybe k) :: Maybe k' where ... Source #

Equations

BindMaybe _ 'Nothing = 'Nothing 
BindMaybe f ('Just k) = f k 

type family JoinMaybe (a :: Maybe (Maybe k)) :: Maybe k where ... Source #

type family LiftM2Maybe (f :: k -> k' -> k'') (a :: Maybe k) (b :: Maybe k') :: Maybe k'' where ... Source #

Equations

LiftM2Maybe _ 'Nothing _ = 'Nothing 
LiftM2Maybe _ ('Just _) 'Nothing = 'Nothing 
LiftM2Maybe f ('Just a) ('Just b) = 'Just (f a b) 

type family LiftTimesMaybe (a :: Maybe Nat) (b :: Maybe Nat) :: Maybe Nat where ... Source #

Equations

LiftTimesMaybe 'Nothing _ = 'Nothing 
LiftTimesMaybe ('Just _) 'Nothing = 'Nothing 
LiftTimesMaybe ('Just a) ('Just b) = 'Just (a * b) 

type family LiftTypeEqMaybe (a :: Maybe k) (b :: Maybe k') :: Constraint where ... Source #

Equations

LiftTypeEqMaybe 'Nothing _ = () 
LiftTypeEqMaybe ('Just _) 'Nothing = () 
LiftTypeEqMaybe ('Just a) ('Just b) = a ~ b 

type family Concat (xs :: [k]) (ys :: [k]) :: [k] where ... Source #

Equations

Concat '[] ys = ys 
Concat (x ': xs) ys = x ': Concat xs ys 

type Reverse xs = ReverseImplF xs '[] Source #

type family (a :: Nat) <? (b :: Nat) where ... Source #

Equations

x <? y = (x `CmpNat` y) == 'LT 

type family When (cond :: Bool) (constraint :: Constraint) :: Constraint where ... Source #

Equations

When 'True constraint = constraint 
When 'False _ = () 

whenM :: Monad m => m Bool -> m () -> m () Source #

unlessM :: Monad m => m Bool -> m () -> m () Source #

ifM :: Monad m => m Bool -> m a -> m a -> m a Source #

guardM :: MonadPlus m => m Bool -> m () Source #

(&&^) :: Monad m => m Bool -> m Bool -> m Bool infixr 3 Source #

The && operator lifted to a monad. If the first argument evaluates to False the second argument will not be evaluated.

(||^) :: Monad m => m Bool -> m Bool -> m Bool infixr 2 Source #

The || operator lifted to a monad. If the first argument evaluates to True the second argument will not be evaluated.

(<&&>) :: Applicative a => a Bool -> a Bool -> a Bool infixr 3 Source #

&& lifted to an Applicative. Unlike &&^ the operator is not short-circuiting.

(<||>) :: Applicative a => a Bool -> a Bool -> a Bool infixr 2 Source #

|| lifted to an Applicative. Unlike ||^ the operator is not short-circuiting.