morley-1.12.0: Developer tools for the Michelson Language
Safe HaskellNone
LanguageHaskell2010

Util.TypeLits

Description

Re-exports TypeLits, modifying it considering our practices.

Synopsis

Documentation

data Symbol #

(Kind) This is the kind of type-level symbols. Declared here because class IP needs it

Instances

Instances details
SingKind Symbol

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Associated Types

type DemoteRep Symbol

Methods

fromSing :: forall (a :: Symbol). Sing a -> DemoteRep Symbol

PIsString Symbol 
Instance details

Defined in Data.Singletons.Prelude.IsString

Associated Types

type FromString arg0 :: a0 #

SIsString Symbol 
Instance details

Defined in Data.Singletons.Prelude.IsString

Methods

sFromString :: forall (t :: Symbol). Sing t -> Sing (Apply FromStringSym0 t) #

PMonoid Symbol 
Instance details

Defined in Data.Singletons.Prelude.Monoid

Associated Types

type Mempty :: a0 #

type Mappend arg0 arg1 :: a0 #

type Mconcat arg0 :: a0 #

SMonoid Symbol 
Instance details

Defined in Data.Singletons.Prelude.Monoid

Methods

sMempty :: Sing MemptySym0 #

sMappend :: forall (t1 :: Symbol) (t2 :: Symbol). Sing t1 -> Sing t2 -> Sing (Apply (Apply MappendSym0 t1) t2) #

sMconcat :: forall (t :: [Symbol]). Sing t -> Sing (Apply MconcatSym0 t) #

PShow Symbol 
Instance details

Defined in Data.Singletons.Prelude.Show

Associated Types

type ShowsPrec arg0 arg1 arg2 :: Symbol #

type Show_ arg0 :: Symbol #

type ShowList arg0 arg1 :: Symbol #

SShow Symbol 
Instance details

Defined in Data.Singletons.Prelude.Show

Methods

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

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

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

PSemigroup Symbol 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

Associated Types

type arg0 <> arg1 :: a0 #

type Sconcat arg0 :: a0 #

SSemigroup Symbol 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

Methods

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

sSconcat :: forall (t :: NonEmpty Symbol). Sing t -> Sing (Apply SconcatSym0 t) #

KnownSymbol a => SingI (a :: Symbol)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

sing :: Sing a

KnownSymbol s => Showtype (s :: Symbol) 
Instance details

Defined in Type.Showtype

Methods

showtype :: proxy s -> String #

showtypesPrec :: Int -> proxy s -> String -> String #

KnownSymbol n => Reifies (n :: Symbol) String 
Instance details

Defined in Data.Reflection

Methods

reflect :: proxy n -> String #

Eq t => Eq (ElField '(s, t)) 
Instance details

Defined in Data.Vinyl.Functor

Methods

(==) :: ElField '(s, t) -> ElField '(s, t) -> Bool #

(/=) :: ElField '(s, t) -> ElField '(s, t) -> Bool #

(Floating t, KnownSymbol s) => Floating (ElField '(s, t)) 
Instance details

Defined in Data.Vinyl.Functor

Methods

pi :: ElField '(s, t) #

exp :: ElField '(s, t) -> ElField '(s, t) #

log :: ElField '(s, t) -> ElField '(s, t) #

sqrt :: ElField '(s, t) -> ElField '(s, t) #

(**) :: ElField '(s, t) -> ElField '(s, t) -> ElField '(s, t) #

logBase :: ElField '(s, t) -> ElField '(s, t) -> ElField '(s, t) #

sin :: ElField '(s, t) -> ElField '(s, t) #

cos :: ElField '(s, t) -> ElField '(s, t) #

tan :: ElField '(s, t) -> ElField '(s, t) #

asin :: ElField '(s, t) -> ElField '(s, t) #

acos :: ElField '(s, t) -> ElField '(s, t) #

atan :: ElField '(s, t) -> ElField '(s, t) #

sinh :: ElField '(s, t) -> ElField '(s, t) #

cosh :: ElField '(s, t) -> ElField '(s, t) #

tanh :: ElField '(s, t) -> ElField '(s, t) #

asinh :: ElField '(s, t) -> ElField '(s, t) #

acosh :: ElField '(s, t) -> ElField '(s, t) #

atanh :: ElField '(s, t) -> ElField '(s, t) #

log1p :: ElField '(s, t) -> ElField '(s, t) #

expm1 :: ElField '(s, t) -> ElField '(s, t) #

log1pexp :: ElField '(s, t) -> ElField '(s, t) #

log1mexp :: ElField '(s, t) -> ElField '(s, t) #

(Fractional t, KnownSymbol s) => Fractional (ElField '(s, t)) 
Instance details

Defined in Data.Vinyl.Functor

Methods

(/) :: ElField '(s, t) -> ElField '(s, t) -> ElField '(s, t) #

recip :: ElField '(s, t) -> ElField '(s, t) #

fromRational :: Rational -> ElField '(s, t) #

(Num t, KnownSymbol s) => Num (ElField '(s, t)) 
Instance details

Defined in Data.Vinyl.Functor

Methods

(+) :: ElField '(s, t) -> ElField '(s, t) -> ElField '(s, t) #

(-) :: ElField '(s, t) -> ElField '(s, t) -> ElField '(s, t) #

(*) :: ElField '(s, t) -> ElField '(s, t) -> ElField '(s, t) #

negate :: ElField '(s, t) -> ElField '(s, t) #

abs :: ElField '(s, t) -> ElField '(s, t) #

signum :: ElField '(s, t) -> ElField '(s, t) #

fromInteger :: Integer -> ElField '(s, t) #

Ord t => Ord (ElField '(s, t)) 
Instance details

Defined in Data.Vinyl.Functor

Methods

compare :: ElField '(s, t) -> ElField '(s, t) -> Ordering #

(<) :: ElField '(s, t) -> ElField '(s, t) -> Bool #

(<=) :: ElField '(s, t) -> ElField '(s, t) -> Bool #

(>) :: ElField '(s, t) -> ElField '(s, t) -> Bool #

(>=) :: ElField '(s, t) -> ElField '(s, t) -> Bool #

max :: ElField '(s, t) -> ElField '(s, t) -> ElField '(s, t) #

min :: ElField '(s, t) -> ElField '(s, t) -> ElField '(s, t) #

(Real t, KnownSymbol s) => Real (ElField '(s, t)) 
Instance details

Defined in Data.Vinyl.Functor

Methods

toRational :: ElField '(s, t) -> Rational #

(RealFrac t, KnownSymbol s) => RealFrac (ElField '(s, t)) 
Instance details

Defined in Data.Vinyl.Functor

Methods

properFraction :: Integral b => ElField '(s, t) -> (b, ElField '(s, t)) #

truncate :: Integral b => ElField '(s, t) -> b #

round :: Integral b => ElField '(s, t) -> b #

ceiling :: Integral b => ElField '(s, t) -> b #

floor :: Integral b => ElField '(s, t) -> b #

(Show t, KnownSymbol s) => Show (ElField '(s, t)) 
Instance details

Defined in Data.Vinyl.Functor

Methods

showsPrec :: Int -> ElField '(s, t) -> ShowS #

show :: ElField '(s, t) -> String #

showList :: [ElField '(s, t)] -> ShowS #

KnownSymbol s => Generic (ElField '(s, a)) 
Instance details

Defined in Data.Vinyl.Functor

Associated Types

type Rep (ElField '(s, a)) :: Type -> Type #

Methods

from :: ElField '(s, a) -> Rep (ElField '(s, a)) x #

to :: Rep (ElField '(s, a)) x -> ElField '(s, a) #

Semigroup t => Semigroup (ElField '(s, t)) 
Instance details

Defined in Data.Vinyl.Functor

Methods

(<>) :: ElField '(s, t) -> ElField '(s, t) -> ElField '(s, t) #

sconcat :: NonEmpty (ElField '(s, t)) -> ElField '(s, t) #

stimes :: Integral b => b -> ElField '(s, t) -> ElField '(s, t) #

(KnownSymbol s, Monoid t) => Monoid (ElField '(s, t)) 
Instance details

Defined in Data.Vinyl.Functor

Methods

mempty :: ElField '(s, t) #

mappend :: ElField '(s, t) -> ElField '(s, t) -> ElField '(s, t) #

mconcat :: [ElField '(s, t)] -> ElField '(s, t) #

(KnownSymbol s, Storable t) => Storable (ElField '(s, t)) 
Instance details

Defined in Data.Vinyl.Functor

Methods

sizeOf :: ElField '(s, t) -> Int #

alignment :: ElField '(s, t) -> Int #

peekElemOff :: Ptr (ElField '(s, t)) -> Int -> IO (ElField '(s, t)) #

pokeElemOff :: Ptr (ElField '(s, t)) -> Int -> ElField '(s, t) -> IO () #

peekByteOff :: Ptr b -> Int -> IO (ElField '(s, t)) #

pokeByteOff :: Ptr b -> Int -> ElField '(s, t) -> IO () #

peek :: Ptr (ElField '(s, t)) -> IO (ElField '(s, t)) #

poke :: Ptr (ElField '(s, t)) -> ElField '(s, t) -> IO () #

SuppressUnusedWarnings ShowParenSym0 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings UnwordsSym0 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings UnlinesSym0 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings Show_tupleSym0 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings ShowsPrec_6989586621680595863Sym0 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings ShowsPrec_6989586621680595887Sym0 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings ShowsNatSym0 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings ShowsPrec_6989586621680577891Sym0 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings ShowsPrec_6989586621680595705Sym0 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings ShowsPrec_6989586621680595917Sym0 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings ShowsPrec_6989586621681091253Sym0 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings ShowsPrec_6989586621681091281Sym0 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings KnownSymbolSym0 
Instance details

Defined in Data.Singletons.TypeLits

SuppressUnusedWarnings ShowCommaSpaceSym0 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings ShowSpaceSym0 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings ShowStringSym0 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings ShowCharSym0 
Instance details

Defined in Data.Singletons.Prelude.Show

SingI ShowParenSym0 
Instance details

Defined in Data.Singletons.Prelude.Show

SingI UnwordsSym0 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SingI UnlinesSym0 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SingI Show_tupleSym0 
Instance details

Defined in Data.Singletons.Prelude.Show

Methods

sing :: Sing Show_tupleSym0 #

SingI ShowCommaSpaceSym0 
Instance details

Defined in Data.Singletons.Prelude.Show

SingI ShowSpaceSym0 
Instance details

Defined in Data.Singletons.Prelude.Show

SingI ShowStringSym0 
Instance details

Defined in Data.Singletons.Prelude.Show

SingI ShowCharSym0 
Instance details

Defined in Data.Singletons.Prelude.Show

KnownSymbol s => IsoHKD ElField ('(s, a) :: (Symbol, Type))

Work with values of type ElField '(s,a) as if they were of type a.

Instance details

Defined in Data.Vinyl.XRec

Associated Types

type HKD ElField '(s, a) #

Methods

unHKD :: HKD ElField '(s, a) -> ElField '(s, a) #

toHKD :: ElField '(s, a) -> HKD ElField '(s, a) #

SuppressUnusedWarnings (ShowsPrec_6989586621680595863Sym1 a6989586621680595860 :: TyFun Bool (Symbol ~> Symbol) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (ShowList_6989586621680577858Sym0 :: TyFun [a6989586621680577383] (Symbol ~> Symbol) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (ShowListSym0 :: TyFun [a6989586621680577383] (Symbol ~> Symbol) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (ShowsPrec_6989586621680595887Sym1 a6989586621680595884 :: TyFun Ordering (Symbol ~> Symbol) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (ShowsPrec_6989586621680577871Sym0 :: TyFun Nat ([a6989586621680577401] ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (ShowsPrec_6989586621680595739Sym0 :: TyFun Nat (Maybe a3530822107858468865 ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (ShowsPrec_6989586621680577836Sym0 :: TyFun Nat (a6989586621680577383 ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

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

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (ShowsPrec_6989586621681091374Sym0 :: TyFun Nat (Min a6989586621679060072 ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (ShowsPrec_6989586621681091405Sym0 :: TyFun Nat (Max a6989586621679060077 ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (ShowsPrec_6989586621681091436Sym0 :: TyFun Nat (First a6989586621679060087 ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (ShowsPrec_6989586621681091467Sym0 :: TyFun Nat (Last a6989586621679060082 ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (ShowsPrec_6989586621681091498Sym0 :: TyFun Nat (WrappedMonoid m6989586621679090734 ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (ShowsPrec_6989586621681091194Sym0 :: TyFun Nat (Option a6989586621679060067 ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (ShowsPrec_6989586621680921160Sym0 :: TyFun Nat (Identity a6989586621680920941 ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Identity

SuppressUnusedWarnings (ShowsPrec_6989586621680637784Sym0 :: TyFun Nat (First a6989586621679087428 ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

SuppressUnusedWarnings (ShowsPrec_6989586621680637815Sym0 :: TyFun Nat (Last a6989586621679087421 ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

SuppressUnusedWarnings (ShowsPrec_6989586621681091225Sym0 :: TyFun Nat (Dual a6989586621679087487 ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (ShowsPrec_6989586621681091312Sym0 :: TyFun Nat (Sum a6989586621679087464 ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (ShowsPrec_6989586621681091343Sym0 :: TyFun Nat (Product a6989586621679087472 ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (ShowsPrec_6989586621680595837Sym0 :: TyFun Nat (NonEmpty a6989586621679060153 ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (ShowStringSym1 a6989586621680577777 :: TyFun Symbol Symbol -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (ShowCharSym1 a6989586621680577787 :: TyFun Symbol Symbol -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (Show_tupleSym1 a6989586621680577725 :: TyFun Symbol Symbol -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (ShowsNatSym1 a6989586621680595203 :: TyFun Symbol Symbol -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (FromStringSym0 :: TyFun Symbol a6989586621681391347 -> Type) 
Instance details

Defined in Data.Singletons.Prelude.IsString

SuppressUnusedWarnings (FromString_6989586621681391383Sym0 :: TyFun Symbol (Identity a6989586621681391352) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.IsString

SuppressUnusedWarnings (ShowsPrec_6989586621680577891Sym1 a6989586621680577888 :: TyFun Symbol (Symbol ~> Symbol) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (ShowsPrec_6989586621680595705Sym1 a6989586621680595702 :: TyFun () (Symbol ~> Symbol) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (ShowsSym0 :: TyFun a6989586621680577368 (Symbol ~> Symbol) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (Show__6989586621680577850Sym0 :: TyFun a6989586621680577383 Symbol -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (Show_Sym0 :: TyFun a6989586621680577383 Symbol -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (Lambda_6989586621680577753Sym0 :: TyFun k (TyFun Symbol Symbol -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (ShowsPrec_6989586621680595917Sym1 a6989586621680595914 :: TyFun Void (Symbol ~> Symbol) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (ShowsPrec_6989586621681091253Sym1 a6989586621681091250 :: TyFun All (Symbol ~> Symbol) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (ShowsPrec_6989586621681091281Sym1 a6989586621681091278 :: TyFun Any (Symbol ~> Symbol) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (ShowParenSym1 a6989586621680577759 :: TyFun (Symbol ~> Symbol) (Symbol ~> Symbol) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (ShowListWithSym0 :: TyFun (a6989586621680577367 ~> (Symbol ~> Symbol)) ([a6989586621680577367] ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SShow a => SingI (ShowListSym0 :: TyFun [a] (Symbol ~> Symbol) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

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

Defined in Data.Singletons.Prelude.Show

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 (ShowCharSym1 d :: TyFun Symbol Symbol -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

Methods

sing :: Sing (ShowCharSym1 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

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 #

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 (ShowListWithSym0 :: TyFun (a ~> (Symbol ~> Symbol)) ([a] ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

(i ~ RIndex t ts, NatToInt i, FieldOffset ElField ts t, Storable (Rec ElField ts), AllConstrained (FieldOffset ElField ts) ts) => RecElem (SRec :: ((Symbol, Type) -> Type) -> [(Symbol, Type)] -> Type) (t :: (Symbol, Type)) (t :: (Symbol, Type)) (ts :: [(Symbol, Type)]) (ts :: [(Symbol, Type)]) i 
Instance details

Defined in Data.Vinyl.SRec

Associated Types

type RecElemFCtx SRec f #

Methods

rlensC :: (Functor g, RecElemFCtx SRec f) => (f t -> g (f t)) -> SRec f ts -> g (SRec f ts) #

rgetC :: (RecElemFCtx SRec f, t ~ t) => SRec f ts -> f t #

rputC :: RecElemFCtx SRec f => f t -> SRec f ts -> SRec f ts #

SuppressUnusedWarnings (ShowsPrec_6989586621680577871Sym1 a6989586621680577868 a6989586621680577401 :: TyFun [a6989586621680577401] (Symbol ~> Symbol) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (ShowListWithSym1 a6989586621680577793 :: TyFun [a6989586621680577367] (Symbol ~> Symbol) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (ShowsPrec_6989586621680595739Sym1 a6989586621680595736 a3530822107858468865 :: TyFun (Maybe a3530822107858468865) (Symbol ~> Symbol) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (ShowsPrec_6989586621680595795Sym0 :: TyFun Nat (Either a6989586621679091042 b6989586621679091043 ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (ShowsPrec_6989586621680577911Sym0 :: TyFun Nat ((a6989586621680577405, b6989586621680577406) ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (ShowsPrec_6989586621681108427Sym0 :: TyFun Nat (Arg a6989586621681107144 b6989586621681107145 ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (ShowParenSym2 a6989586621680577760 a6989586621680577759 :: TyFun Symbol Symbol -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (ShowsSym1 a6989586621680577813 :: TyFun Symbol Symbol -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (ShowListSym1 arg6989586621680577829 :: TyFun Symbol Symbol -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (ShowsPrec_6989586621681091253Sym2 a6989586621681091251 a6989586621681091250 :: TyFun Symbol Symbol -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (ShowsPrec_6989586621681091281Sym2 a6989586621681091279 a6989586621681091278 :: TyFun Symbol Symbol -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (ShowList_6989586621680577858Sym1 a6989586621680577856 :: TyFun Symbol Symbol -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (ShowsPrec_6989586621680577891Sym2 a6989586621680577889 a6989586621680577888 :: TyFun Symbol Symbol -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (ShowsPrec_6989586621680595705Sym2 a6989586621680595703 a6989586621680595702 :: TyFun Symbol Symbol -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (ShowsPrec_6989586621680595863Sym2 a6989586621680595861 a6989586621680595860 :: TyFun Symbol Symbol -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (ShowsPrec_6989586621680595887Sym2 a6989586621680595885 a6989586621680595884 :: TyFun Symbol Symbol -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (ShowsPrec_6989586621680595917Sym2 a6989586621680595915 a6989586621680595914 :: TyFun Symbol Symbol -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (Lambda_6989586621680577753Sym1 a_69895866216805777486989586621680577752 :: TyFun Symbol Symbol -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (ShowsPrec_6989586621680577836Sym1 a6989586621680577833 a6989586621680577383 :: TyFun a6989586621680577383 (Symbol ~> Symbol) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (ShowsPrecSym1 arg6989586621680577821 a6989586621680577383 :: TyFun a6989586621680577383 (Symbol ~> Symbol) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (Let6989586621680321072GoSym0 :: TyFun k1 (TyFun k2 (TyFun [Symbol] Symbol -> Type) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (ShowsPrec_6989586621681091374Sym1 a6989586621681091371 a6989586621679060072 :: TyFun (Min a6989586621679060072) (Symbol ~> Symbol) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (ShowsPrec_6989586621681091405Sym1 a6989586621681091402 a6989586621679060077 :: TyFun (Max a6989586621679060077) (Symbol ~> Symbol) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (ShowsPrec_6989586621681091436Sym1 a6989586621681091433 a6989586621679060087 :: TyFun (First a6989586621679060087) (Symbol ~> Symbol) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (ShowsPrec_6989586621681091467Sym1 a6989586621681091464 a6989586621679060082 :: TyFun (Last a6989586621679060082) (Symbol ~> Symbol) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (ShowsPrec_6989586621681091498Sym1 a6989586621681091495 m6989586621679090734 :: TyFun (WrappedMonoid m6989586621679090734) (Symbol ~> Symbol) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (ShowsPrec_6989586621681091194Sym1 a6989586621681091191 a6989586621679060067 :: TyFun (Option a6989586621679060067) (Symbol ~> Symbol) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (ShowsPrec_6989586621680921160Sym1 a6989586621680921157 a6989586621680920941 :: TyFun (Identity a6989586621680920941) (Symbol ~> Symbol) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Identity

SuppressUnusedWarnings (ShowsPrec_6989586621680637784Sym1 a6989586621680637781 a6989586621679087428 :: TyFun (First a6989586621679087428) (Symbol ~> Symbol) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

SuppressUnusedWarnings (ShowsPrec_6989586621680637815Sym1 a6989586621680637812 a6989586621679087421 :: TyFun (Last a6989586621679087421) (Symbol ~> Symbol) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

SuppressUnusedWarnings (ShowsPrec_6989586621681091225Sym1 a6989586621681091222 a6989586621679087487 :: TyFun (Dual a6989586621679087487) (Symbol ~> Symbol) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (ShowsPrec_6989586621681091312Sym1 a6989586621681091309 a6989586621679087464 :: TyFun (Sum a6989586621679087464) (Symbol ~> Symbol) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (ShowsPrec_6989586621681091343Sym1 a6989586621681091340 a6989586621679087472 :: TyFun (Product a6989586621679087472) (Symbol ~> Symbol) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (ShowsPrec_6989586621680595837Sym1 a6989586621680595834 a6989586621679060153 :: TyFun (NonEmpty a6989586621679060153) (Symbol ~> Symbol) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SingI d => SingI (ShowListWithSym1 d :: TyFun [a] (Symbol ~> Symbol) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

Methods

sing :: Sing (ShowListWithSym1 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) #

(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 (ErrorWithoutStackTraceSym0 :: TyFun Symbol a -> Type) 
Instance details

Defined in Data.Singletons.TypeLits.Internal

SingI (ErrorSym0 :: TyFun Symbol a -> Type) 
Instance details

Defined in Data.Singletons.TypeLits.Internal

Methods

sing :: Sing ErrorSym0 #

(SShow a, SingI d) => SingI (ShowsPrecSym1 d a :: TyFun a (Symbol ~> Symbol) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

Methods

sing :: Sing (ShowsPrecSym1 d a) #

(i ~ RIndex t ts, NatToInt i, FieldOffset ElField ts t, Storable (Rec ElField ts), AllConstrained (FieldOffset ElField ts) ts) => RecElem (SRec2 ElField) (t :: (Symbol, Type)) (t :: (Symbol, Type)) (ts :: [(Symbol, Type)]) (ts :: [(Symbol, Type)]) i

Field accessors for SRec2 specialized to ElField as the functor.

Instance details

Defined in Data.Vinyl.SRec

Associated Types

type RecElemFCtx (SRec2 ElField) f #

Methods

rlensC :: (Functor g, RecElemFCtx (SRec2 ElField) f) => (f t -> g (f t)) -> SRec2 ElField f ts -> g (SRec2 ElField f ts) #

rgetC :: (RecElemFCtx (SRec2 ElField) f, t ~ t) => SRec2 ElField f ts -> f t #

rputC :: RecElemFCtx (SRec2 ElField) f => f t -> SRec2 ElField f ts -> SRec2 ElField f ts #

(is ~ RImage rs ss, RecSubset (Rec :: ((Symbol, Type) -> Type) -> [(Symbol, Type)] -> Type) rs ss is, Storable (Rec ElField rs), Storable (Rec ElField ss), RPureConstrained (FieldOffset ElField ss) rs, RPureConstrained (FieldOffset ElField rs) rs, RFoldMap rs, RMap rs, RApply rs) => RecSubset (SRec :: ((Symbol, Type) -> Type) -> [(Symbol, Type)] -> Type) (rs :: [(Symbol, Type)]) (ss :: [(Symbol, Type)]) is 
Instance details

Defined in Data.Vinyl.SRec

Associated Types

type RecSubsetFCtx SRec f #

Methods

rsubsetC :: forall g (f :: k -> Type). (Functor g, RecSubsetFCtx SRec f) => (SRec f rs -> g (SRec f rs)) -> SRec f ss -> g (SRec f ss) #

rcastC :: forall (f :: k -> Type). RecSubsetFCtx SRec f => SRec f ss -> SRec f rs #

rreplaceC :: forall (f :: k -> Type). RecSubsetFCtx SRec f => SRec f rs -> SRec f ss -> SRec f ss #

(is ~ RImage rs ss, RecSubset (Rec :: ((Symbol, Type) -> Type) -> [(Symbol, Type)] -> Type) rs ss is, Storable (Rec ElField rs), Storable (Rec ElField ss), RPureConstrained (FieldOffset ElField ss) rs, RPureConstrained (FieldOffset ElField rs) rs, RFoldMap rs, RMap rs, RApply rs) => RecSubset (SRec2 ElField) (rs :: [(Symbol, Type)]) (ss :: [(Symbol, Type)]) is 
Instance details

Defined in Data.Vinyl.SRec

Associated Types

type RecSubsetFCtx (SRec2 ElField) f #

Methods

rsubsetC :: forall g (f :: k -> Type). (Functor g, RecSubsetFCtx (SRec2 ElField) f) => (SRec2 ElField f rs -> g (SRec2 ElField f rs)) -> SRec2 ElField f ss -> g (SRec2 ElField f ss) #

rcastC :: forall (f :: k -> Type). RecSubsetFCtx (SRec2 ElField) f => SRec2 ElField f ss -> SRec2 ElField f rs #

rreplaceC :: forall (f :: k -> Type). RecSubsetFCtx (SRec2 ElField) f => SRec2 ElField f rs -> SRec2 ElField f ss -> SRec2 ElField f ss #

SuppressUnusedWarnings (ShowsPrec_6989586621680595795Sym1 a6989586621680595792 a6989586621679091042 b6989586621679091043 :: TyFun (Either a6989586621679091042 b6989586621679091043) (Symbol ~> Symbol) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (ShowsPrec_6989586621680577928Sym0 :: TyFun Nat ((a6989586621680577410, b6989586621680577411, c6989586621680577412) ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (ShowsPrec_6989586621680953659Sym0 :: TyFun Nat (Const a6989586621680952802 b6989586621680952803 ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Const

SuppressUnusedWarnings (ShowListWithSym2 a6989586621680577794 a6989586621680577793 :: TyFun Symbol Symbol -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (ShowsPrecSym2 arg6989586621680577822 arg6989586621680577821 :: TyFun Symbol Symbol -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (ShowsPrec_6989586621681091194Sym2 a6989586621681091192 a6989586621681091191 :: TyFun Symbol Symbol -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (ShowsPrec_6989586621681091225Sym2 a6989586621681091223 a6989586621681091222 :: TyFun Symbol Symbol -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (ShowsPrec_6989586621681091312Sym2 a6989586621681091310 a6989586621681091309 :: TyFun Symbol Symbol -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (ShowsPrec_6989586621681091343Sym2 a6989586621681091341 a6989586621681091340 :: TyFun Symbol Symbol -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (ShowsPrec_6989586621681091374Sym2 a6989586621681091372 a6989586621681091371 :: TyFun Symbol Symbol -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (ShowsPrec_6989586621681091405Sym2 a6989586621681091403 a6989586621681091402 :: TyFun Symbol Symbol -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (ShowsPrec_6989586621681091436Sym2 a6989586621681091434 a6989586621681091433 :: TyFun Symbol Symbol -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (ShowsPrec_6989586621681091467Sym2 a6989586621681091465 a6989586621681091464 :: TyFun Symbol Symbol -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (ShowsPrec_6989586621681091498Sym2 a6989586621681091496 a6989586621681091495 :: TyFun Symbol Symbol -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (ShowsPrec_6989586621680921160Sym2 a6989586621680921158 a6989586621680921157 :: TyFun Symbol Symbol -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Identity

SuppressUnusedWarnings (ShowsPrec_6989586621680637784Sym2 a6989586621680637782 a6989586621680637781 :: TyFun Symbol Symbol -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

SuppressUnusedWarnings (ShowsPrec_6989586621680637815Sym2 a6989586621680637813 a6989586621680637812 :: TyFun Symbol Symbol -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

SuppressUnusedWarnings (ShowsPrec_6989586621680577836Sym2 a6989586621680577834 a6989586621680577833 :: TyFun Symbol Symbol -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (ShowsPrec_6989586621680577871Sym2 a6989586621680577869 a6989586621680577868 :: TyFun Symbol Symbol -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (ShowsPrec_6989586621680595739Sym2 a6989586621680595737 a6989586621680595736 :: TyFun Symbol Symbol -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (ShowsPrec_6989586621680595837Sym2 a6989586621680595835 a6989586621680595834 :: TyFun Symbol Symbol -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (FromString_6989586621681391376Sym0 :: TyFun Symbol (Const a6989586621681391349 b6989586621681391350) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.IsString

SuppressUnusedWarnings (ShowsPrec_6989586621680577911Sym1 a6989586621680577908 a6989586621680577405 b6989586621680577406 :: TyFun (a6989586621680577405, b6989586621680577406) (Symbol ~> Symbol) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (Let6989586621680321072GoSym1 w6989586621680321070 :: TyFun k2 (TyFun [Symbol] Symbol -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (ShowsPrec_6989586621681108427Sym1 a6989586621681108424 a6989586621681107144 b6989586621681107145 :: TyFun (Arg a6989586621681107144 b6989586621681107145) (Symbol ~> Symbol) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (Let6989586621680577804ShowlSym0 :: TyFun (k1 ~> (Symbol ~> Symbol)) (TyFun k2 (TyFun k3 (TyFun Symbol (TyFun [k1] Symbol -> Type) -> Type) -> Type) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

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

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

SuppressUnusedWarnings (Let6989586621680321072GoSym2 ws6989586621680321071 w6989586621680321070 :: TyFun [Symbol] Symbol -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (ShowsPrec_6989586621680577946Sym0 :: TyFun Nat ((a6989586621680577417, b6989586621680577418, c6989586621680577419, d6989586621680577420) ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (ShowsPrec_6989586621681108427Sym2 a6989586621681108425 a6989586621681108424 :: TyFun Symbol Symbol -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (ShowsPrec_6989586621680577911Sym2 a6989586621680577909 a6989586621680577908 :: TyFun Symbol Symbol -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (ShowsPrec_6989586621680595795Sym2 a6989586621680595793 a6989586621680595792 :: TyFun Symbol Symbol -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (ShowsPrec_6989586621680577928Sym1 a6989586621680577925 a6989586621680577410 b6989586621680577411 c6989586621680577412 :: TyFun (a6989586621680577410, b6989586621680577411, c6989586621680577412) (Symbol ~> Symbol) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (Let6989586621680577804ShowlSym1 showx6989586621680577800 :: TyFun k2 (TyFun k3 (TyFun Symbol (TyFun [k1] Symbol -> Type) -> Type) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (Lambda_6989586621680577733Sym0 :: TyFun k1 (TyFun k2 (TyFun (Symbol ~> c6989586621679941607) (TyFun (a6989586621679941608 ~> Symbol) (TyFun a6989586621679941608 c6989586621679941607 -> Type) -> Type) -> Type) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (ShowsPrec_6989586621680953659Sym1 a6989586621680953656 a6989586621680952802 b6989586621680952803 :: TyFun (Const a6989586621680952802 b6989586621680952803) (Symbol ~> Symbol) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Const

SuppressUnusedWarnings (ShowsPrec_6989586621680577965Sym0 :: TyFun Nat ((a6989586621680577426, b6989586621680577427, c6989586621680577428, d6989586621680577429, e6989586621680577430) ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (ShowsPrec_6989586621680953659Sym2 a6989586621680953657 a6989586621680953656 :: TyFun Symbol Symbol -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Const

SuppressUnusedWarnings (ShowsPrec_6989586621680577928Sym2 a6989586621680577926 a6989586621680577925 :: TyFun Symbol Symbol -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (ShowsPrec_6989586621680577946Sym1 a6989586621680577943 a6989586621680577417 b6989586621680577418 c6989586621680577419 d6989586621680577420 :: TyFun (a6989586621680577417, b6989586621680577418, c6989586621680577419, d6989586621680577420) (Symbol ~> Symbol) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (Let6989586621680577804ShowlSym2 x6989586621680577801 showx6989586621680577800 :: TyFun k3 (TyFun Symbol (TyFun [k1] Symbol -> Type) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (Lambda_6989586621680577733Sym1 ss6989586621680577731 :: TyFun k2 (TyFun (Symbol ~> c6989586621679941607) (TyFun (a6989586621679941608 ~> Symbol) (TyFun a6989586621679941608 c6989586621679941607 -> Type) -> Type) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (ShowsPrec_6989586621680577985Sym0 :: TyFun Nat ((a6989586621680577437, b6989586621680577438, c6989586621680577439, d6989586621680577440, e6989586621680577441, f6989586621680577442) ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (Let6989586621680577804ShowlSym3 xs6989586621680577802 x6989586621680577801 showx6989586621680577800 :: TyFun Symbol (TyFun [k1] Symbol -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (ShowsPrec_6989586621680577946Sym2 a6989586621680577944 a6989586621680577943 :: TyFun Symbol Symbol -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (ShowsPrec_6989586621680577965Sym1 a6989586621680577962 a6989586621680577426 b6989586621680577427 c6989586621680577428 d6989586621680577429 e6989586621680577430 :: TyFun (a6989586621680577426, b6989586621680577427, c6989586621680577428, d6989586621680577429, e6989586621680577430) (Symbol ~> Symbol) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (Lambda_6989586621680577733Sym2 a_69895866216805777296989586621680577732 ss6989586621680577731 :: TyFun (Symbol ~> c6989586621679941607) (TyFun (a6989586621679941608 ~> Symbol) (TyFun a6989586621679941608 c6989586621679941607 -> Type) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (Let6989586621680577804ShowlSym4 s6989586621680577803 xs6989586621680577802 x6989586621680577801 showx6989586621680577800 :: TyFun [k1] Symbol -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (ShowsPrec_6989586621680578006Sym0 :: TyFun Nat ((a6989586621680577450, b6989586621680577451, c6989586621680577452, d6989586621680577453, e6989586621680577454, f6989586621680577455, g6989586621680577456) ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (ShowsPrec_6989586621680577965Sym2 a6989586621680577963 a6989586621680577962 :: TyFun Symbol Symbol -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (ShowsPrec_6989586621680577985Sym1 a6989586621680577982 a6989586621680577437 b6989586621680577438 c6989586621680577439 d6989586621680577440 e6989586621680577441 f6989586621680577442 :: TyFun (a6989586621680577437, b6989586621680577438, c6989586621680577439, d6989586621680577440, e6989586621680577441, f6989586621680577442) (Symbol ~> Symbol) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (Lambda_6989586621680577733Sym3 t6989586621680577737 a_69895866216805777296989586621680577732 ss6989586621680577731 :: TyFun (a6989586621679941608 ~> Symbol) (TyFun a6989586621679941608 c6989586621679941607 -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (ShowsPrec_6989586621680577985Sym2 a6989586621680577983 a6989586621680577982 :: TyFun Symbol Symbol -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (ShowsPrec_6989586621680578006Sym1 a6989586621680578003 a6989586621680577450 b6989586621680577451 c6989586621680577452 d6989586621680577453 e6989586621680577454 f6989586621680577455 g6989586621680577456 :: TyFun (a6989586621680577450, b6989586621680577451, c6989586621680577452, d6989586621680577453, e6989586621680577454, f6989586621680577455, g6989586621680577456) (Symbol ~> Symbol) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (ShowsPrec_6989586621680578006Sym2 a6989586621680578004 a6989586621680578003 :: TyFun Symbol Symbol -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

TypeHasDoc a => GProductHasDoc (S1 ('MetaSel ('Nothing :: Maybe Symbol) _1 _2 _3) (Rec0 a)) Source # 
Instance details

Defined in Michelson.Typed.Haskell.Doc

(TypeHasDoc a, KnownSymbol field) => GProductHasDoc (S1 ('MetaSel ('Just field) _1 _2 _3) (Rec0 a)) Source # 
Instance details

Defined in Michelson.Typed.Haskell.Doc

data Sing (s :: Symbol) 
Instance details

Defined in GHC.Generics

data Sing (s :: Symbol) where
type DemoteRep Symbol 
Instance details

Defined in GHC.Generics

type DemoteRep Symbol = String
type MEmpty 
Instance details

Defined in Fcf.Class.Monoid

type MEmpty = ""
type Mempty 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Mempty = Mempty_6989586621680631390Sym0 :: Symbol
type Sing 
Instance details

Defined in Data.Singletons.TypeLits.Internal

type Sing = SSymbol
type Demote Symbol 
Instance details

Defined in Data.Singletons.TypeLits.Internal

type FromString a 
Instance details

Defined in Data.Singletons.Prelude.IsString

type FromString a = a
type Mconcat (arg0 :: [Symbol]) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Mconcat (arg0 :: [Symbol]) = Apply (Mconcat_6989586621680631307Sym0 :: TyFun [Symbol] Symbol -> Type) arg0
type Show_ (arg0 :: Symbol) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Show_ (arg0 :: Symbol) = Apply (Show__6989586621680577850Sym0 :: TyFun Symbol Symbol -> Type) arg0
type Sconcat (arg0 :: NonEmpty Symbol) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Sconcat (arg0 :: NonEmpty Symbol) = Apply (Sconcat_6989586621680187695Sym0 :: TyFun (NonEmpty Symbol) Symbol -> Type) arg0
type (x :: Symbol) <> (y :: Symbol)

With base >= 4.10.0.0.

Instance details

Defined in Fcf.Class.Monoid

type (x :: Symbol) <> (y :: Symbol) = AppendSymbol x y
type Mappend (arg1 :: Symbol) (arg2 :: Symbol) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Mappend (arg1 :: Symbol) (arg2 :: Symbol) = Apply (Apply (Mappend_6989586621680631292Sym0 :: TyFun Symbol (Symbol ~> Symbol) -> Type) arg1) arg2
type ShowList (arg1 :: [Symbol]) arg2 
Instance details

Defined in Data.Singletons.Prelude.Show

type ShowList (arg1 :: [Symbol]) arg2 = Apply (Apply (ShowList_6989586621680577858Sym0 :: TyFun [Symbol] (Symbol ~> Symbol) -> Type) arg1) arg2
type (a :: Symbol) <> (b :: Symbol) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type (a :: Symbol) <> (b :: Symbol) = AppendSymbol a b
type Min (arg1 :: Symbol) (arg2 :: Symbol) 
Instance details

Defined in Data.Singletons.TypeLits.Internal

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

Defined in Data.Singletons.TypeLits.Internal

type Max (arg1 :: Symbol) (arg2 :: Symbol) = Apply (Apply (Max_6989586621679792600Sym0 :: TyFun Symbol (Symbol ~> Symbol) -> Type) arg1) arg2
type (arg1 :: Symbol) >= (arg2 :: Symbol) 
Instance details

Defined in Data.Singletons.TypeLits.Internal

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

Defined in Data.Singletons.TypeLits.Internal

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

Defined in Data.Singletons.TypeLits.Internal

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

Defined in Data.Singletons.TypeLits.Internal

type (arg1 :: Symbol) < (arg2 :: Symbol) = Apply (Apply (TFHelper_6989586621679792528Sym0 :: TyFun Symbol (Symbol ~> Bool) -> Type) arg1) arg2
type Compare (a :: Symbol) (b :: Symbol) 
Instance details

Defined in Data.Singletons.TypeLits.Internal

type Compare (a :: Symbol) (b :: Symbol) = CmpSymbol a b
type (x :: Symbol) /= (y :: Symbol) 
Instance details

Defined in Data.Singletons.TypeLits.Internal

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

Defined in Data.Singletons.TypeLits.Internal

type (x :: Symbol) == (y :: Symbol) = DefaultEq x y
type ShowsPrec a1 (a2 :: Symbol) a3 
Instance details

Defined in Data.Singletons.Prelude.Show

type ShowsPrec a1 (a2 :: Symbol) a3 = Apply (Apply (Apply ShowsPrec_6989586621680577891Sym0 a1) a2) a3
type Apply KnownSymbolSym0 (n6989586621679863488 :: Symbol) 
Instance details

Defined in Data.Singletons.TypeLits

type Apply KnownSymbolSym0 (n6989586621679863488 :: Symbol) = KnownSymbol n6989586621679863488
type Apply ShowCommaSpaceSym0 (a6989586621680577745 :: Symbol) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply ShowCommaSpaceSym0 (a6989586621680577745 :: Symbol) = ShowCommaSpace a6989586621680577745
type Apply ShowSpaceSym0 (a6989586621680577750 :: Symbol) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply ShowSpaceSym0 (a6989586621680577750 :: Symbol) = ShowSpace a6989586621680577750
type Apply (ShowStringSym1 a6989586621680577777 :: TyFun Symbol Symbol -> Type) (a6989586621680577778 :: Symbol) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowStringSym1 a6989586621680577777 :: TyFun Symbol Symbol -> Type) (a6989586621680577778 :: Symbol) = ShowString a6989586621680577777 a6989586621680577778
type Apply (ShowCharSym1 a6989586621680577787 :: TyFun Symbol Symbol -> Type) (a6989586621680577788 :: Symbol) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowCharSym1 a6989586621680577787 :: TyFun Symbol Symbol -> Type) (a6989586621680577788 :: Symbol) = ShowChar a6989586621680577787 a6989586621680577788
type Apply (Show_tupleSym1 a6989586621680577725 :: TyFun Symbol Symbol -> Type) (a6989586621680577726 :: Symbol) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (Show_tupleSym1 a6989586621680577725 :: TyFun Symbol Symbol -> Type) (a6989586621680577726 :: Symbol) = Show_tuple a6989586621680577725 a6989586621680577726
type Apply (ShowsNatSym1 a6989586621680595203 :: TyFun Symbol Symbol -> Type) (a6989586621680595204 :: Symbol) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsNatSym1 a6989586621680595203 :: TyFun Symbol Symbol -> Type) (a6989586621680595204 :: Symbol) = ShowsNat a6989586621680595203 a6989586621680595204
type Apply (FromStringSym0 :: TyFun Symbol k2 -> Type) (arg6989586621681391373 :: Symbol) 
Instance details

Defined in Data.Singletons.Prelude.IsString

type Apply (FromStringSym0 :: TyFun Symbol k2 -> Type) (arg6989586621681391373 :: Symbol) = FromString arg6989586621681391373 :: k2
type Apply (Show__6989586621680577850Sym0 :: TyFun a Symbol -> Type) (a6989586621680577849 :: a) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (Show__6989586621680577850Sym0 :: TyFun a Symbol -> Type) (a6989586621680577849 :: a) = Show__6989586621680577850 a6989586621680577849
type Apply (Show_Sym0 :: TyFun a Symbol -> Type) (arg6989586621680577827 :: a) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (Show_Sym0 :: TyFun a Symbol -> Type) (arg6989586621680577827 :: a) = Show_ arg6989586621680577827
type Apply (ShowParenSym2 a6989586621680577760 a6989586621680577759 :: TyFun Symbol Symbol -> Type) (a6989586621680577761 :: Symbol) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowParenSym2 a6989586621680577760 a6989586621680577759 :: TyFun Symbol Symbol -> Type) (a6989586621680577761 :: Symbol) = ShowParen a6989586621680577760 a6989586621680577759 a6989586621680577761
type Apply (ShowsSym1 a6989586621680577813 :: TyFun Symbol Symbol -> Type) (a6989586621680577814 :: Symbol) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsSym1 a6989586621680577813 :: TyFun Symbol Symbol -> Type) (a6989586621680577814 :: Symbol) = Shows a6989586621680577813 a6989586621680577814
type Apply (ShowListSym1 arg6989586621680577829 :: TyFun Symbol Symbol -> Type) (arg6989586621680577830 :: Symbol) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowListSym1 arg6989586621680577829 :: TyFun Symbol Symbol -> Type) (arg6989586621680577830 :: Symbol) = ShowList arg6989586621680577829 arg6989586621680577830
type Apply (ShowsPrec_6989586621681091253Sym2 a6989586621681091251 a6989586621681091250 :: TyFun Symbol Symbol -> Type) (a6989586621681091252 :: Symbol) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ShowsPrec_6989586621681091253Sym2 a6989586621681091251 a6989586621681091250 :: TyFun Symbol Symbol -> Type) (a6989586621681091252 :: Symbol) = ShowsPrec_6989586621681091253 a6989586621681091251 a6989586621681091250 a6989586621681091252
type Apply (ShowsPrec_6989586621681091281Sym2 a6989586621681091279 a6989586621681091278 :: TyFun Symbol Symbol -> Type) (a6989586621681091280 :: Symbol) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ShowsPrec_6989586621681091281Sym2 a6989586621681091279 a6989586621681091278 :: TyFun Symbol Symbol -> Type) (a6989586621681091280 :: Symbol) = ShowsPrec_6989586621681091281 a6989586621681091279 a6989586621681091278 a6989586621681091280
type Apply (Lambda_6989586621680577753Sym1 a_69895866216805777486989586621680577752 :: TyFun Symbol Symbol -> Type) (t6989586621680577756 :: Symbol) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (Lambda_6989586621680577753Sym1 a_69895866216805777486989586621680577752 :: TyFun Symbol Symbol -> Type) (t6989586621680577756 :: Symbol) = Lambda_6989586621680577753 a_69895866216805777486989586621680577752 t6989586621680577756
type Apply (ShowList_6989586621680577858Sym1 a6989586621680577856 :: TyFun Symbol Symbol -> Type) (a6989586621680577857 :: Symbol) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowList_6989586621680577858Sym1 a6989586621680577856 :: TyFun Symbol Symbol -> Type) (a6989586621680577857 :: Symbol) = ShowList_6989586621680577858 a6989586621680577856 a6989586621680577857
type Apply (ShowsPrec_6989586621680577891Sym2 a6989586621680577889 a6989586621680577888 :: TyFun Symbol Symbol -> Type) (a6989586621680577890 :: Symbol) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680577891Sym2 a6989586621680577889 a6989586621680577888 :: TyFun Symbol Symbol -> Type) (a6989586621680577890 :: Symbol) = ShowsPrec_6989586621680577891 a6989586621680577889 a6989586621680577888 a6989586621680577890
type Apply (ShowsPrec_6989586621680595705Sym2 a6989586621680595703 a6989586621680595702 :: TyFun Symbol Symbol -> Type) (a6989586621680595704 :: Symbol) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680595705Sym2 a6989586621680595703 a6989586621680595702 :: TyFun Symbol Symbol -> Type) (a6989586621680595704 :: Symbol) = ShowsPrec_6989586621680595705 a6989586621680595703 a6989586621680595702 a6989586621680595704
type Apply (ShowsPrec_6989586621680595863Sym2 a6989586621680595861 a6989586621680595860 :: TyFun Symbol Symbol -> Type) (a6989586621680595862 :: Symbol) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680595863Sym2 a6989586621680595861 a6989586621680595860 :: TyFun Symbol Symbol -> Type) (a6989586621680595862 :: Symbol) = ShowsPrec_6989586621680595863 a6989586621680595861 a6989586621680595860 a6989586621680595862
type Apply (ShowsPrec_6989586621680595887Sym2 a6989586621680595885 a6989586621680595884 :: TyFun Symbol Symbol -> Type) (a6989586621680595886 :: Symbol) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680595887Sym2 a6989586621680595885 a6989586621680595884 :: TyFun Symbol Symbol -> Type) (a6989586621680595886 :: Symbol) = ShowsPrec_6989586621680595887 a6989586621680595885 a6989586621680595884 a6989586621680595886
type Apply (ShowsPrec_6989586621680595917Sym2 a6989586621680595915 a6989586621680595914 :: TyFun Symbol Symbol -> Type) (a6989586621680595916 :: Symbol) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680595917Sym2 a6989586621680595915 a6989586621680595914 :: TyFun Symbol Symbol -> Type) (a6989586621680595916 :: Symbol) = ShowsPrec_6989586621680595917 a6989586621680595915 a6989586621680595914 a6989586621680595916
type Apply (ShowListWithSym2 a6989586621680577794 a6989586621680577793 :: TyFun Symbol Symbol -> Type) (a6989586621680577795 :: Symbol) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowListWithSym2 a6989586621680577794 a6989586621680577793 :: TyFun Symbol Symbol -> Type) (a6989586621680577795 :: Symbol) = ShowListWith a6989586621680577794 a6989586621680577793 a6989586621680577795
type Apply (ShowsPrecSym2 arg6989586621680577822 arg6989586621680577821 :: TyFun Symbol Symbol -> Type) (arg6989586621680577823 :: Symbol) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrecSym2 arg6989586621680577822 arg6989586621680577821 :: TyFun Symbol Symbol -> Type) (arg6989586621680577823 :: Symbol) = ShowsPrec arg6989586621680577822 arg6989586621680577821 arg6989586621680577823
type Apply (ShowsPrec_6989586621681091194Sym2 a6989586621681091192 a6989586621681091191 :: TyFun Symbol Symbol -> Type) (a6989586621681091193 :: Symbol) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ShowsPrec_6989586621681091194Sym2 a6989586621681091192 a6989586621681091191 :: TyFun Symbol Symbol -> Type) (a6989586621681091193 :: Symbol) = ShowsPrec_6989586621681091194 a6989586621681091192 a6989586621681091191 a6989586621681091193
type Apply (ShowsPrec_6989586621681091225Sym2 a6989586621681091223 a6989586621681091222 :: TyFun Symbol Symbol -> Type) (a6989586621681091224 :: Symbol) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ShowsPrec_6989586621681091225Sym2 a6989586621681091223 a6989586621681091222 :: TyFun Symbol Symbol -> Type) (a6989586621681091224 :: Symbol) = ShowsPrec_6989586621681091225 a6989586621681091223 a6989586621681091222 a6989586621681091224
type Apply (ShowsPrec_6989586621681091312Sym2 a6989586621681091310 a6989586621681091309 :: TyFun Symbol Symbol -> Type) (a6989586621681091311 :: Symbol) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ShowsPrec_6989586621681091312Sym2 a6989586621681091310 a6989586621681091309 :: TyFun Symbol Symbol -> Type) (a6989586621681091311 :: Symbol) = ShowsPrec_6989586621681091312 a6989586621681091310 a6989586621681091309 a6989586621681091311
type Apply (ShowsPrec_6989586621681091343Sym2 a6989586621681091341 a6989586621681091340 :: TyFun Symbol Symbol -> Type) (a6989586621681091342 :: Symbol) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ShowsPrec_6989586621681091343Sym2 a6989586621681091341 a6989586621681091340 :: TyFun Symbol Symbol -> Type) (a6989586621681091342 :: Symbol) = ShowsPrec_6989586621681091343 a6989586621681091341 a6989586621681091340 a6989586621681091342
type Apply (ShowsPrec_6989586621681091374Sym2 a6989586621681091372 a6989586621681091371 :: TyFun Symbol Symbol -> Type) (a6989586621681091373 :: Symbol) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ShowsPrec_6989586621681091374Sym2 a6989586621681091372 a6989586621681091371 :: TyFun Symbol Symbol -> Type) (a6989586621681091373 :: Symbol) = ShowsPrec_6989586621681091374 a6989586621681091372 a6989586621681091371 a6989586621681091373
type Apply (ShowsPrec_6989586621681091405Sym2 a6989586621681091403 a6989586621681091402 :: TyFun Symbol Symbol -> Type) (a6989586621681091404 :: Symbol) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ShowsPrec_6989586621681091405Sym2 a6989586621681091403 a6989586621681091402 :: TyFun Symbol Symbol -> Type) (a6989586621681091404 :: Symbol) = ShowsPrec_6989586621681091405 a6989586621681091403 a6989586621681091402 a6989586621681091404
type Apply (ShowsPrec_6989586621681091436Sym2 a6989586621681091434 a6989586621681091433 :: TyFun Symbol Symbol -> Type) (a6989586621681091435 :: Symbol) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ShowsPrec_6989586621681091436Sym2 a6989586621681091434 a6989586621681091433 :: TyFun Symbol Symbol -> Type) (a6989586621681091435 :: Symbol) = ShowsPrec_6989586621681091436 a6989586621681091434 a6989586621681091433 a6989586621681091435
type Apply (ShowsPrec_6989586621681091467Sym2 a6989586621681091465 a6989586621681091464 :: TyFun Symbol Symbol -> Type) (a6989586621681091466 :: Symbol) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ShowsPrec_6989586621681091467Sym2 a6989586621681091465 a6989586621681091464 :: TyFun Symbol Symbol -> Type) (a6989586621681091466 :: Symbol) = ShowsPrec_6989586621681091467 a6989586621681091465 a6989586621681091464 a6989586621681091466
type Apply (ShowsPrec_6989586621681091498Sym2 a6989586621681091496 a6989586621681091495 :: TyFun Symbol Symbol -> Type) (a6989586621681091497 :: Symbol) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ShowsPrec_6989586621681091498Sym2 a6989586621681091496 a6989586621681091495 :: TyFun Symbol Symbol -> Type) (a6989586621681091497 :: Symbol) = ShowsPrec_6989586621681091498 a6989586621681091496 a6989586621681091495 a6989586621681091497
type Apply (ShowsPrec_6989586621680921160Sym2 a6989586621680921158 a6989586621680921157 :: TyFun Symbol Symbol -> Type) (a6989586621680921159 :: Symbol) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type Apply (ShowsPrec_6989586621680921160Sym2 a6989586621680921158 a6989586621680921157 :: TyFun Symbol Symbol -> Type) (a6989586621680921159 :: Symbol) = ShowsPrec_6989586621680921160 a6989586621680921158 a6989586621680921157 a6989586621680921159
type Apply (ShowsPrec_6989586621680637784Sym2 a6989586621680637782 a6989586621680637781 :: TyFun Symbol Symbol -> Type) (a6989586621680637783 :: Symbol) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (ShowsPrec_6989586621680637784Sym2 a6989586621680637782 a6989586621680637781 :: TyFun Symbol Symbol -> Type) (a6989586621680637783 :: Symbol) = ShowsPrec_6989586621680637784 a6989586621680637782 a6989586621680637781 a6989586621680637783
type Apply (ShowsPrec_6989586621680637815Sym2 a6989586621680637813 a6989586621680637812 :: TyFun Symbol Symbol -> Type) (a6989586621680637814 :: Symbol) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (ShowsPrec_6989586621680637815Sym2 a6989586621680637813 a6989586621680637812 :: TyFun Symbol Symbol -> Type) (a6989586621680637814 :: Symbol) = ShowsPrec_6989586621680637815 a6989586621680637813 a6989586621680637812 a6989586621680637814
type Apply (ShowsPrec_6989586621680577836Sym2 a6989586621680577834 a6989586621680577833 :: TyFun Symbol Symbol -> Type) (a6989586621680577835 :: Symbol) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680577836Sym2 a6989586621680577834 a6989586621680577833 :: TyFun Symbol Symbol -> Type) (a6989586621680577835 :: Symbol) = ShowsPrec_6989586621680577836 a6989586621680577834 a6989586621680577833 a6989586621680577835
type Apply (ShowsPrec_6989586621680577871Sym2 a6989586621680577869 a6989586621680577868 :: TyFun Symbol Symbol -> Type) (a6989586621680577870 :: Symbol) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680577871Sym2 a6989586621680577869 a6989586621680577868 :: TyFun Symbol Symbol -> Type) (a6989586621680577870 :: Symbol) = ShowsPrec_6989586621680577871 a6989586621680577869 a6989586621680577868 a6989586621680577870
type Apply (ShowsPrec_6989586621680595739Sym2 a6989586621680595737 a6989586621680595736 :: TyFun Symbol Symbol -> Type) (a6989586621680595738 :: Symbol) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680595739Sym2 a6989586621680595737 a6989586621680595736 :: TyFun Symbol Symbol -> Type) (a6989586621680595738 :: Symbol) = ShowsPrec_6989586621680595739 a6989586621680595737 a6989586621680595736 a6989586621680595738
type Apply (ShowsPrec_6989586621680595837Sym2 a6989586621680595835 a6989586621680595834 :: TyFun Symbol Symbol -> Type) (a6989586621680595836 :: Symbol) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680595837Sym2 a6989586621680595835 a6989586621680595834 :: TyFun Symbol Symbol -> Type) (a6989586621680595836 :: Symbol) = ShowsPrec_6989586621680595837 a6989586621680595835 a6989586621680595834 a6989586621680595836
type Apply (ShowsPrec_6989586621681108427Sym2 a6989586621681108425 a6989586621681108424 :: TyFun Symbol Symbol -> Type) (a6989586621681108426 :: Symbol) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ShowsPrec_6989586621681108427Sym2 a6989586621681108425 a6989586621681108424 :: TyFun Symbol Symbol -> Type) (a6989586621681108426 :: Symbol) = ShowsPrec_6989586621681108427 a6989586621681108425 a6989586621681108424 a6989586621681108426
type Apply (ShowsPrec_6989586621680577911Sym2 a6989586621680577909 a6989586621680577908 :: TyFun Symbol Symbol -> Type) (a6989586621680577910 :: Symbol) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680577911Sym2 a6989586621680577909 a6989586621680577908 :: TyFun Symbol Symbol -> Type) (a6989586621680577910 :: Symbol) = ShowsPrec_6989586621680577911 a6989586621680577909 a6989586621680577908 a6989586621680577910
type Apply (ShowsPrec_6989586621680595795Sym2 a6989586621680595793 a6989586621680595792 :: TyFun Symbol Symbol -> Type) (a6989586621680595794 :: Symbol) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680595795Sym2 a6989586621680595793 a6989586621680595792 :: TyFun Symbol Symbol -> Type) (a6989586621680595794 :: Symbol) = ShowsPrec_6989586621680595795 a6989586621680595793 a6989586621680595792 a6989586621680595794
type Apply (ShowsPrec_6989586621680953659Sym2 a6989586621680953657 a6989586621680953656 :: TyFun Symbol Symbol -> Type) (a6989586621680953658 :: Symbol) 
Instance details

Defined in Data.Singletons.Prelude.Const

type Apply (ShowsPrec_6989586621680953659Sym2 a6989586621680953657 a6989586621680953656 :: TyFun Symbol Symbol -> Type) (a6989586621680953658 :: Symbol) = ShowsPrec_6989586621680953659 a6989586621680953657 a6989586621680953656 a6989586621680953658
type Apply (ShowsPrec_6989586621680577928Sym2 a6989586621680577926 a6989586621680577925 :: TyFun Symbol Symbol -> Type) (a6989586621680577927 :: Symbol) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680577928Sym2 a6989586621680577926 a6989586621680577925 :: TyFun Symbol Symbol -> Type) (a6989586621680577927 :: Symbol) = ShowsPrec_6989586621680577928 a6989586621680577926 a6989586621680577925 a6989586621680577927
type Apply (ShowsPrec_6989586621680577946Sym2 a6989586621680577944 a6989586621680577943 :: TyFun Symbol Symbol -> Type) (a6989586621680577945 :: Symbol) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680577946Sym2 a6989586621680577944 a6989586621680577943 :: TyFun Symbol Symbol -> Type) (a6989586621680577945 :: Symbol) = ShowsPrec_6989586621680577946 a6989586621680577944 a6989586621680577943 a6989586621680577945
type Apply (ShowsPrec_6989586621680577965Sym2 a6989586621680577963 a6989586621680577962 :: TyFun Symbol Symbol -> Type) (a6989586621680577964 :: Symbol) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680577965Sym2 a6989586621680577963 a6989586621680577962 :: TyFun Symbol Symbol -> Type) (a6989586621680577964 :: Symbol) = ShowsPrec_6989586621680577965 a6989586621680577963 a6989586621680577962 a6989586621680577964
type Apply (ShowsPrec_6989586621680577985Sym2 a6989586621680577983 a6989586621680577982 :: TyFun Symbol Symbol -> Type) (a6989586621680577984 :: Symbol) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680577985Sym2 a6989586621680577983 a6989586621680577982 :: TyFun Symbol Symbol -> Type) (a6989586621680577984 :: Symbol) = ShowsPrec_6989586621680577985 a6989586621680577983 a6989586621680577982 a6989586621680577984
type Apply (ShowsPrec_6989586621680578006Sym2 a6989586621680578004 a6989586621680578003 :: TyFun Symbol Symbol -> Type) (a6989586621680578005 :: Symbol) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680578006Sym2 a6989586621680578004 a6989586621680578003 :: TyFun Symbol Symbol -> Type) (a6989586621680578005 :: Symbol) = ShowsPrec_6989586621680578006 a6989586621680578004 a6989586621680578003 a6989586621680578005
type Apply (FromString_6989586621681391383Sym0 :: TyFun Symbol (Identity a6989586621681391352) -> Type) (a6989586621681391382 :: Symbol) 
Instance details

Defined in Data.Singletons.Prelude.IsString

type Apply (FromString_6989586621681391383Sym0 :: TyFun Symbol (Identity a6989586621681391352) -> Type) (a6989586621681391382 :: Symbol) = FromString_6989586621681391383 a6989586621681391382 :: Identity a6989586621681391352
type Apply ShowParenSym0 (a6989586621680577759 :: Bool) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply ShowParenSym0 (a6989586621680577759 :: Bool) = ShowParenSym1 a6989586621680577759
type Apply ShowsPrec_6989586621680595863Sym0 (a6989586621680595860 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply ShowsPrec_6989586621680595863Sym0 (a6989586621680595860 :: Nat) = ShowsPrec_6989586621680595863Sym1 a6989586621680595860
type Apply ShowsPrec_6989586621680595887Sym0 (a6989586621680595884 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply ShowsPrec_6989586621680595887Sym0 (a6989586621680595884 :: Nat) = ShowsPrec_6989586621680595887Sym1 a6989586621680595884
type Apply ShowsNatSym0 (a6989586621680595203 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply ShowsNatSym0 (a6989586621680595203 :: Nat) = ShowsNatSym1 a6989586621680595203
type Apply ShowsPrec_6989586621680577891Sym0 (a6989586621680577888 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply ShowsPrec_6989586621680577891Sym0 (a6989586621680577888 :: Nat) = ShowsPrec_6989586621680577891Sym1 a6989586621680577888
type Apply ShowsPrec_6989586621680595705Sym0 (a6989586621680595702 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply ShowsPrec_6989586621680595705Sym0 (a6989586621680595702 :: Nat) = ShowsPrec_6989586621680595705Sym1 a6989586621680595702
type Apply ShowsPrec_6989586621680595917Sym0 (a6989586621680595914 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply ShowsPrec_6989586621680595917Sym0 (a6989586621680595914 :: Nat) = ShowsPrec_6989586621680595917Sym1 a6989586621680595914
type Apply ShowsPrec_6989586621681091253Sym0 (a6989586621681091250 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply ShowsPrec_6989586621681091253Sym0 (a6989586621681091250 :: Nat) = ShowsPrec_6989586621681091253Sym1 a6989586621681091250
type Apply ShowsPrec_6989586621681091281Sym0 (a6989586621681091278 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply ShowsPrec_6989586621681091281Sym0 (a6989586621681091278 :: Nat) = ShowsPrec_6989586621681091281Sym1 a6989586621681091278
type Apply ShowStringSym0 (a6989586621680577777 :: Symbol) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply ShowStringSym0 (a6989586621680577777 :: Symbol) = ShowStringSym1 a6989586621680577777
type Apply ShowCharSym0 (a6989586621680577787 :: Symbol) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply ShowCharSym0 (a6989586621680577787 :: Symbol) = ShowCharSym1 a6989586621680577787
type Apply (ShowsPrec_6989586621680595863Sym1 a6989586621680595860 :: TyFun Bool (Symbol ~> Symbol) -> Type) (a6989586621680595861 :: Bool) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680595863Sym1 a6989586621680595860 :: TyFun Bool (Symbol ~> Symbol) -> Type) (a6989586621680595861 :: Bool) = ShowsPrec_6989586621680595863Sym2 a6989586621680595860 a6989586621680595861
type Apply (ShowsPrec_6989586621680595887Sym1 a6989586621680595884 :: TyFun Ordering (Symbol ~> Symbol) -> Type) (a6989586621680595885 :: Ordering) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680595887Sym1 a6989586621680595884 :: TyFun Ordering (Symbol ~> Symbol) -> Type) (a6989586621680595885 :: Ordering) = ShowsPrec_6989586621680595887Sym2 a6989586621680595884 a6989586621680595885
type Apply (ShowsPrec_6989586621680577871Sym0 :: TyFun Nat ([a6989586621680577401] ~> (Symbol ~> Symbol)) -> Type) (a6989586621680577868 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680577871Sym0 :: TyFun Nat ([a6989586621680577401] ~> (Symbol ~> Symbol)) -> Type) (a6989586621680577868 :: Nat) = ShowsPrec_6989586621680577871Sym1 a6989586621680577868 a6989586621680577401 :: TyFun [a6989586621680577401] (Symbol ~> Symbol) -> Type
type Apply (ShowsPrec_6989586621680595739Sym0 :: TyFun Nat (Maybe a3530822107858468865 ~> (Symbol ~> Symbol)) -> Type) (a6989586621680595736 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680595739Sym0 :: TyFun Nat (Maybe a3530822107858468865 ~> (Symbol ~> Symbol)) -> Type) (a6989586621680595736 :: Nat) = ShowsPrec_6989586621680595739Sym1 a6989586621680595736 a3530822107858468865 :: TyFun (Maybe a3530822107858468865) (Symbol ~> Symbol) -> Type
type Apply (ShowsPrec_6989586621680577836Sym0 :: TyFun Nat (a6989586621680577383 ~> (Symbol ~> Symbol)) -> Type) (a6989586621680577833 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680577836Sym0 :: TyFun Nat (a6989586621680577383 ~> (Symbol ~> Symbol)) -> Type) (a6989586621680577833 :: Nat) = ShowsPrec_6989586621680577836Sym1 a6989586621680577833 a6989586621680577383 :: TyFun a6989586621680577383 (Symbol ~> Symbol) -> Type
type Apply (ShowsPrecSym0 :: TyFun Nat (a6989586621680577383 ~> (Symbol ~> Symbol)) -> Type) (arg6989586621680577821 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrecSym0 :: TyFun Nat (a6989586621680577383 ~> (Symbol ~> Symbol)) -> Type) (arg6989586621680577821 :: Nat) = ShowsPrecSym1 arg6989586621680577821 a6989586621680577383 :: TyFun a6989586621680577383 (Symbol ~> Symbol) -> Type
type Apply (ShowsPrec_6989586621681091374Sym0 :: TyFun Nat (Min a6989586621679060072 ~> (Symbol ~> Symbol)) -> Type) (a6989586621681091371 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ShowsPrec_6989586621681091374Sym0 :: TyFun Nat (Min a6989586621679060072 ~> (Symbol ~> Symbol)) -> Type) (a6989586621681091371 :: Nat) = ShowsPrec_6989586621681091374Sym1 a6989586621681091371 a6989586621679060072 :: TyFun (Min a6989586621679060072) (Symbol ~> Symbol) -> Type
type Apply (ShowsPrec_6989586621681091405Sym0 :: TyFun Nat (Max a6989586621679060077 ~> (Symbol ~> Symbol)) -> Type) (a6989586621681091402 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ShowsPrec_6989586621681091405Sym0 :: TyFun Nat (Max a6989586621679060077 ~> (Symbol ~> Symbol)) -> Type) (a6989586621681091402 :: Nat) = ShowsPrec_6989586621681091405Sym1 a6989586621681091402 a6989586621679060077 :: TyFun (Max a6989586621679060077) (Symbol ~> Symbol) -> Type
type Apply (ShowsPrec_6989586621681091436Sym0 :: TyFun Nat (First a6989586621679060087 ~> (Symbol ~> Symbol)) -> Type) (a6989586621681091433 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ShowsPrec_6989586621681091436Sym0 :: TyFun Nat (First a6989586621679060087 ~> (Symbol ~> Symbol)) -> Type) (a6989586621681091433 :: Nat) = ShowsPrec_6989586621681091436Sym1 a6989586621681091433 a6989586621679060087 :: TyFun (First a6989586621679060087) (Symbol ~> Symbol) -> Type
type Apply (ShowsPrec_6989586621681091467Sym0 :: TyFun Nat (Last a6989586621679060082 ~> (Symbol ~> Symbol)) -> Type) (a6989586621681091464 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ShowsPrec_6989586621681091467Sym0 :: TyFun Nat (Last a6989586621679060082 ~> (Symbol ~> Symbol)) -> Type) (a6989586621681091464 :: Nat) = ShowsPrec_6989586621681091467Sym1 a6989586621681091464 a6989586621679060082 :: TyFun (Last a6989586621679060082) (Symbol ~> Symbol) -> Type
type Apply (ShowsPrec_6989586621681091498Sym0 :: TyFun Nat (WrappedMonoid m6989586621679090734 ~> (Symbol ~> Symbol)) -> Type) (a6989586621681091495 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ShowsPrec_6989586621681091498Sym0 :: TyFun Nat (WrappedMonoid m6989586621679090734 ~> (Symbol ~> Symbol)) -> Type) (a6989586621681091495 :: Nat) = ShowsPrec_6989586621681091498Sym1 a6989586621681091495 m6989586621679090734 :: TyFun (WrappedMonoid m6989586621679090734) (Symbol ~> Symbol) -> Type
type Apply (ShowsPrec_6989586621681091194Sym0 :: TyFun Nat (Option a6989586621679060067 ~> (Symbol ~> Symbol)) -> Type) (a6989586621681091191 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ShowsPrec_6989586621681091194Sym0 :: TyFun Nat (Option a6989586621679060067 ~> (Symbol ~> Symbol)) -> Type) (a6989586621681091191 :: Nat) = ShowsPrec_6989586621681091194Sym1 a6989586621681091191 a6989586621679060067 :: TyFun (Option a6989586621679060067) (Symbol ~> Symbol) -> Type
type Apply (ShowsPrec_6989586621680921160Sym0 :: TyFun Nat (Identity a6989586621680920941 ~> (Symbol ~> Symbol)) -> Type) (a6989586621680921157 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type Apply (ShowsPrec_6989586621680921160Sym0 :: TyFun Nat (Identity a6989586621680920941 ~> (Symbol ~> Symbol)) -> Type) (a6989586621680921157 :: Nat) = ShowsPrec_6989586621680921160Sym1 a6989586621680921157 a6989586621680920941 :: TyFun (Identity a6989586621680920941) (Symbol ~> Symbol) -> Type
type Apply (ShowsPrec_6989586621680637784Sym0 :: TyFun Nat (First a6989586621679087428 ~> (Symbol ~> Symbol)) -> Type) (a6989586621680637781 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (ShowsPrec_6989586621680637784Sym0 :: TyFun Nat (First a6989586621679087428 ~> (Symbol ~> Symbol)) -> Type) (a6989586621680637781 :: Nat) = ShowsPrec_6989586621680637784Sym1 a6989586621680637781 a6989586621679087428 :: TyFun (First a6989586621679087428) (Symbol ~> Symbol) -> Type
type Apply (ShowsPrec_6989586621680637815Sym0 :: TyFun Nat (Last a6989586621679087421 ~> (Symbol ~> Symbol)) -> Type) (a6989586621680637812 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (ShowsPrec_6989586621680637815Sym0 :: TyFun Nat (Last a6989586621679087421 ~> (Symbol ~> Symbol)) -> Type) (a6989586621680637812 :: Nat) = ShowsPrec_6989586621680637815Sym1 a6989586621680637812 a6989586621679087421 :: TyFun (Last a6989586621679087421) (Symbol ~> Symbol) -> Type
type Apply (ShowsPrec_6989586621681091225Sym0 :: TyFun Nat (Dual a6989586621679087487 ~> (Symbol ~> Symbol)) -> Type) (a6989586621681091222 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ShowsPrec_6989586621681091225Sym0 :: TyFun Nat (Dual a6989586621679087487 ~> (Symbol ~> Symbol)) -> Type) (a6989586621681091222 :: Nat) = ShowsPrec_6989586621681091225Sym1 a6989586621681091222 a6989586621679087487 :: TyFun (Dual a6989586621679087487) (Symbol ~> Symbol) -> Type
type Apply (ShowsPrec_6989586621681091312Sym0 :: TyFun Nat (Sum a6989586621679087464 ~> (Symbol ~> Symbol)) -> Type) (a6989586621681091309 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ShowsPrec_6989586621681091312Sym0 :: TyFun Nat (Sum a6989586621679087464 ~> (Symbol ~> Symbol)) -> Type) (a6989586621681091309 :: Nat) = ShowsPrec_6989586621681091312Sym1 a6989586621681091309 a6989586621679087464 :: TyFun (Sum a6989586621679087464) (Symbol ~> Symbol) -> Type
type Apply (ShowsPrec_6989586621681091343Sym0 :: TyFun Nat (Product a6989586621679087472 ~> (Symbol ~> Symbol)) -> Type) (a6989586621681091340 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ShowsPrec_6989586621681091343Sym0 :: TyFun Nat (Product a6989586621679087472 ~> (Symbol ~> Symbol)) -> Type) (a6989586621681091340 :: Nat) = ShowsPrec_6989586621681091343Sym1 a6989586621681091340 a6989586621679087472 :: TyFun (Product a6989586621679087472) (Symbol ~> Symbol) -> Type
type Apply (ShowsPrec_6989586621680595837Sym0 :: TyFun Nat (NonEmpty a6989586621679060153 ~> (Symbol ~> Symbol)) -> Type) (a6989586621680595834 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680595837Sym0 :: TyFun Nat (NonEmpty a6989586621679060153 ~> (Symbol ~> Symbol)) -> Type) (a6989586621680595834 :: Nat) = ShowsPrec_6989586621680595837Sym1 a6989586621680595834 a6989586621679060153 :: TyFun (NonEmpty a6989586621679060153) (Symbol ~> Symbol) -> Type
type Apply (ShowsPrec_6989586621680577891Sym1 a6989586621680577888 :: TyFun Symbol (Symbol ~> Symbol) -> Type) (a6989586621680577889 :: Symbol) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680577891Sym1 a6989586621680577888 :: TyFun Symbol (Symbol ~> Symbol) -> Type) (a6989586621680577889 :: Symbol) = ShowsPrec_6989586621680577891Sym2 a6989586621680577888 a6989586621680577889
type Apply (ShowsPrec_6989586621680595705Sym1 a6989586621680595702 :: TyFun () (Symbol ~> Symbol) -> Type) (a6989586621680595703 :: ()) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680595705Sym1 a6989586621680595702 :: TyFun () (Symbol ~> Symbol) -> Type) (a6989586621680595703 :: ()) = ShowsPrec_6989586621680595705Sym2 a6989586621680595702 a6989586621680595703
type Apply (Lambda_6989586621680577753Sym0 :: TyFun k (TyFun Symbol Symbol -> Type) -> Type) (a_69895866216805777486989586621680577752 :: k) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (Lambda_6989586621680577753Sym0 :: TyFun k (TyFun Symbol Symbol -> Type) -> Type) (a_69895866216805777486989586621680577752 :: k) = Lambda_6989586621680577753Sym1 a_69895866216805777486989586621680577752
type Apply (ShowsSym0 :: TyFun a6989586621680577368 (Symbol ~> Symbol) -> Type) (a6989586621680577813 :: a6989586621680577368) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsSym0 :: TyFun a6989586621680577368 (Symbol ~> Symbol) -> Type) (a6989586621680577813 :: a6989586621680577368) = ShowsSym1 a6989586621680577813
type Apply (ShowsPrec_6989586621680595917Sym1 a6989586621680595914 :: TyFun Void (Symbol ~> Symbol) -> Type) (a6989586621680595915 :: Void) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680595917Sym1 a6989586621680595914 :: TyFun Void (Symbol ~> Symbol) -> Type) (a6989586621680595915 :: Void) = ShowsPrec_6989586621680595917Sym2 a6989586621680595914 a6989586621680595915
type Apply (ShowsPrec_6989586621681091253Sym1 a6989586621681091250 :: TyFun All (Symbol ~> Symbol) -> Type) (a6989586621681091251 :: All) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ShowsPrec_6989586621681091253Sym1 a6989586621681091250 :: TyFun All (Symbol ~> Symbol) -> Type) (a6989586621681091251 :: All) = ShowsPrec_6989586621681091253Sym2 a6989586621681091250 a6989586621681091251
type Apply (ShowsPrec_6989586621681091281Sym1 a6989586621681091278 :: TyFun Any (Symbol ~> Symbol) -> Type) (a6989586621681091279 :: Any) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ShowsPrec_6989586621681091281Sym1 a6989586621681091278 :: TyFun Any (Symbol ~> Symbol) -> Type) (a6989586621681091279 :: Any) = ShowsPrec_6989586621681091281Sym2 a6989586621681091278 a6989586621681091279
type Apply (ShowsPrec_6989586621680595795Sym0 :: TyFun Nat (Either a6989586621679091042 b6989586621679091043 ~> (Symbol ~> Symbol)) -> Type) (a6989586621680595792 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680595795Sym0 :: TyFun Nat (Either a6989586621679091042 b6989586621679091043 ~> (Symbol ~> Symbol)) -> Type) (a6989586621680595792 :: Nat) = ShowsPrec_6989586621680595795Sym1 a6989586621680595792 a6989586621679091042 b6989586621679091043 :: TyFun (Either a6989586621679091042 b6989586621679091043) (Symbol ~> Symbol) -> Type
type Apply (ShowsPrec_6989586621680577911Sym0 :: TyFun Nat ((a6989586621680577405, b6989586621680577406) ~> (Symbol ~> Symbol)) -> Type) (a6989586621680577908 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680577911Sym0 :: TyFun Nat ((a6989586621680577405, b6989586621680577406) ~> (Symbol ~> Symbol)) -> Type) (a6989586621680577908 :: Nat) = ShowsPrec_6989586621680577911Sym1 a6989586621680577908 a6989586621680577405 b6989586621680577406 :: TyFun (a6989586621680577405, b6989586621680577406) (Symbol ~> Symbol) -> Type
type Apply (ShowsPrec_6989586621681108427Sym0 :: TyFun Nat (Arg a6989586621681107144 b6989586621681107145 ~> (Symbol ~> Symbol)) -> Type) (a6989586621681108424 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ShowsPrec_6989586621681108427Sym0 :: TyFun Nat (Arg a6989586621681107144 b6989586621681107145 ~> (Symbol ~> Symbol)) -> Type) (a6989586621681108424 :: Nat) = ShowsPrec_6989586621681108427Sym1 a6989586621681108424 a6989586621681107144 b6989586621681107145 :: TyFun (Arg a6989586621681107144 b6989586621681107145) (Symbol ~> Symbol) -> Type
type Apply (ShowsPrec_6989586621680577836Sym1 a6989586621680577833 a6989586621680577383 :: TyFun a6989586621680577383 (Symbol ~> Symbol) -> Type) (a6989586621680577834 :: a6989586621680577383) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680577836Sym1 a6989586621680577833 a6989586621680577383 :: TyFun a6989586621680577383 (Symbol ~> Symbol) -> Type) (a6989586621680577834 :: a6989586621680577383) = ShowsPrec_6989586621680577836Sym2 a6989586621680577833 a6989586621680577834
type Apply (ShowsPrecSym1 arg6989586621680577821 a6989586621680577383 :: TyFun a6989586621680577383 (Symbol ~> Symbol) -> Type) (arg6989586621680577822 :: a6989586621680577383) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrecSym1 arg6989586621680577821 a6989586621680577383 :: TyFun a6989586621680577383 (Symbol ~> Symbol) -> Type) (arg6989586621680577822 :: a6989586621680577383) = ShowsPrecSym2 arg6989586621680577821 arg6989586621680577822
type Apply (Let6989586621680321072GoSym0 :: TyFun k1 (TyFun k2 (TyFun [Symbol] Symbol -> Type) -> Type) -> Type) (w6989586621680321070 :: k1) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (Let6989586621680321072GoSym0 :: TyFun k1 (TyFun k2 (TyFun [Symbol] Symbol -> Type) -> Type) -> Type) (w6989586621680321070 :: k1) = Let6989586621680321072GoSym1 w6989586621680321070 :: TyFun k2 (TyFun [Symbol] Symbol -> Type) -> Type
type Apply (ShowsPrec_6989586621680577928Sym0 :: TyFun Nat ((a6989586621680577410, b6989586621680577411, c6989586621680577412) ~> (Symbol ~> Symbol)) -> Type) (a6989586621680577925 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680577928Sym0 :: TyFun Nat ((a6989586621680577410, b6989586621680577411, c6989586621680577412) ~> (Symbol ~> Symbol)) -> Type) (a6989586621680577925 :: Nat) = ShowsPrec_6989586621680577928Sym1 a6989586621680577925 a6989586621680577410 b6989586621680577411 c6989586621680577412 :: TyFun (a6989586621680577410, b6989586621680577411, c6989586621680577412) (Symbol ~> Symbol) -> Type
type Apply (ShowsPrec_6989586621680953659Sym0 :: TyFun Nat (Const a6989586621680952802 b6989586621680952803 ~> (Symbol ~> Symbol)) -> Type) (a6989586621680953656 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Const

type Apply (ShowsPrec_6989586621680953659Sym0 :: TyFun Nat (Const a6989586621680952802 b6989586621680952803 ~> (Symbol ~> Symbol)) -> Type) (a6989586621680953656 :: Nat) = ShowsPrec_6989586621680953659Sym1 a6989586621680953656 a6989586621680952802 b6989586621680952803 :: TyFun (Const a6989586621680952802 b6989586621680952803) (Symbol ~> Symbol) -> Type
type Apply (Let6989586621680321072GoSym1 w6989586621680321070 :: TyFun k2 (TyFun [Symbol] Symbol -> Type) -> Type) (ws6989586621680321071 :: k2) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (Let6989586621680321072GoSym1 w6989586621680321070 :: TyFun k2 (TyFun [Symbol] Symbol -> Type) -> Type) (ws6989586621680321071 :: k2) = Let6989586621680321072GoSym2 w6989586621680321070 ws6989586621680321071
type Apply (ShowsPrec_6989586621680577946Sym0 :: TyFun Nat ((a6989586621680577417, b6989586621680577418, c6989586621680577419, d6989586621680577420) ~> (Symbol ~> Symbol)) -> Type) (a6989586621680577943 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680577946Sym0 :: TyFun Nat ((a6989586621680577417, b6989586621680577418, c6989586621680577419, d6989586621680577420) ~> (Symbol ~> Symbol)) -> Type) (a6989586621680577943 :: Nat) = ShowsPrec_6989586621680577946Sym1 a6989586621680577943 a6989586621680577417 b6989586621680577418 c6989586621680577419 d6989586621680577420 :: TyFun (a6989586621680577417, b6989586621680577418, c6989586621680577419, d6989586621680577420) (Symbol ~> Symbol) -> Type
type Apply (Let6989586621680577804ShowlSym1 showx6989586621680577800 :: TyFun k2 (TyFun k3 (TyFun Symbol (TyFun [k1] Symbol -> Type) -> Type) -> Type) -> Type) (x6989586621680577801 :: k2) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (Let6989586621680577804ShowlSym1 showx6989586621680577800 :: TyFun k2 (TyFun k3 (TyFun Symbol (TyFun [k1] Symbol -> Type) -> Type) -> Type) -> Type) (x6989586621680577801 :: k2) = Let6989586621680577804ShowlSym2 showx6989586621680577800 x6989586621680577801 :: TyFun k3 (TyFun Symbol (TyFun [k1] Symbol -> Type) -> Type) -> Type
type Apply (Lambda_6989586621680577733Sym0 :: TyFun k1 (TyFun k2 (TyFun (Symbol ~> c6989586621679941607) (TyFun (a6989586621679941608 ~> Symbol) (TyFun a6989586621679941608 c6989586621679941607 -> Type) -> Type) -> Type) -> Type) -> Type) (ss6989586621680577731 :: k1) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (Lambda_6989586621680577733Sym0 :: TyFun k1 (TyFun k2 (TyFun (Symbol ~> c6989586621679941607) (TyFun (a6989586621679941608 ~> Symbol) (TyFun a6989586621679941608 c6989586621679941607 -> Type) -> Type) -> Type) -> Type) -> Type) (ss6989586621680577731 :: k1) = Lambda_6989586621680577733Sym1 ss6989586621680577731 :: TyFun k2 (TyFun (Symbol ~> c6989586621679941607) (TyFun (a6989586621679941608 ~> Symbol) (TyFun a6989586621679941608 c6989586621679941607 -> Type) -> Type) -> Type) -> Type
type Apply (ShowsPrec_6989586621680577965Sym0 :: TyFun Nat ((a6989586621680577426, b6989586621680577427, c6989586621680577428, d6989586621680577429, e6989586621680577430) ~> (Symbol ~> Symbol)) -> Type) (a6989586621680577962 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680577965Sym0 :: TyFun Nat ((a6989586621680577426, b6989586621680577427, c6989586621680577428, d6989586621680577429, e6989586621680577430) ~> (Symbol ~> Symbol)) -> Type) (a6989586621680577962 :: Nat) = ShowsPrec_6989586621680577965Sym1 a6989586621680577962 a6989586621680577426 b6989586621680577427 c6989586621680577428 d6989586621680577429 e6989586621680577430 :: TyFun (a6989586621680577426, b6989586621680577427, c6989586621680577428, d6989586621680577429, e6989586621680577430) (Symbol ~> Symbol) -> Type
type Apply (Let6989586621680577804ShowlSym2 x6989586621680577801 showx6989586621680577800 :: TyFun k3 (TyFun Symbol (TyFun [k1] Symbol -> Type) -> Type) -> Type) (xs6989586621680577802 :: k3) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (Let6989586621680577804ShowlSym2 x6989586621680577801 showx6989586621680577800 :: TyFun k3 (TyFun Symbol (TyFun [k1] Symbol -> Type) -> Type) -> Type) (xs6989586621680577802 :: k3) = Let6989586621680577804ShowlSym3 x6989586621680577801 showx6989586621680577800 xs6989586621680577802
type Apply (Lambda_6989586621680577733Sym1 ss6989586621680577731 :: TyFun k2 (TyFun (Symbol ~> c6989586621679941607) (TyFun (a6989586621679941608 ~> Symbol) (TyFun a6989586621679941608 c6989586621679941607 -> Type) -> Type) -> Type) -> Type) (a_69895866216805777296989586621680577732 :: k2) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (Lambda_6989586621680577733Sym1 ss6989586621680577731 :: TyFun k2 (TyFun (Symbol ~> c6989586621679941607) (TyFun (a6989586621679941608 ~> Symbol) (TyFun a6989586621679941608 c6989586621679941607 -> Type) -> Type) -> Type) -> Type) (a_69895866216805777296989586621680577732 :: k2) = Lambda_6989586621680577733Sym2 ss6989586621680577731 a_69895866216805777296989586621680577732 :: TyFun (Symbol ~> c6989586621679941607) (TyFun (a6989586621679941608 ~> Symbol) (TyFun a6989586621679941608 c6989586621679941607 -> Type) -> Type) -> Type
type Apply (ShowsPrec_6989586621680577985Sym0 :: TyFun Nat ((a6989586621680577437, b6989586621680577438, c6989586621680577439, d6989586621680577440, e6989586621680577441, f6989586621680577442) ~> (Symbol ~> Symbol)) -> Type) (a6989586621680577982 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680577985Sym0 :: TyFun Nat ((a6989586621680577437, b6989586621680577438, c6989586621680577439, d6989586621680577440, e6989586621680577441, f6989586621680577442) ~> (Symbol ~> Symbol)) -> Type) (a6989586621680577982 :: Nat) = ShowsPrec_6989586621680577985Sym1 a6989586621680577982 a6989586621680577437 b6989586621680577438 c6989586621680577439 d6989586621680577440 e6989586621680577441 f6989586621680577442 :: TyFun (a6989586621680577437, b6989586621680577438, c6989586621680577439, d6989586621680577440, e6989586621680577441, f6989586621680577442) (Symbol ~> Symbol) -> Type
type Apply (Let6989586621680577804ShowlSym3 xs6989586621680577802 x6989586621680577801 showx6989586621680577800 :: TyFun Symbol (TyFun [k1] Symbol -> Type) -> Type) (s6989586621680577803 :: Symbol) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (Let6989586621680577804ShowlSym3 xs6989586621680577802 x6989586621680577801 showx6989586621680577800 :: TyFun Symbol (TyFun [k1] Symbol -> Type) -> Type) (s6989586621680577803 :: Symbol) = Let6989586621680577804ShowlSym4 xs6989586621680577802 x6989586621680577801 showx6989586621680577800 s6989586621680577803
type Apply (ShowsPrec_6989586621680578006Sym0 :: TyFun Nat ((a6989586621680577450, b6989586621680577451, c6989586621680577452, d6989586621680577453, e6989586621680577454, f6989586621680577455, g6989586621680577456) ~> (Symbol ~> Symbol)) -> Type) (a6989586621680578003 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680578006Sym0 :: TyFun Nat ((a6989586621680577450, b6989586621680577451, c6989586621680577452, d6989586621680577453, e6989586621680577454, f6989586621680577455, g6989586621680577456) ~> (Symbol ~> Symbol)) -> Type) (a6989586621680578003 :: Nat) = ShowsPrec_6989586621680578006Sym1 a6989586621680578003 a6989586621680577450 b6989586621680577451 c6989586621680577452 d6989586621680577453 e6989586621680577454 f6989586621680577455 g6989586621680577456 :: TyFun (a6989586621680577450, b6989586621680577451, c6989586621680577452, d6989586621680577453, e6989586621680577454, f6989586621680577455, g6989586621680577456) (Symbol ~> Symbol) -> Type
type Apply (FromString_6989586621681391376Sym0 :: TyFun Symbol (Const a6989586621681391349 b6989586621681391350) -> Type) (a6989586621681391375 :: Symbol) 
Instance details

Defined in Data.Singletons.Prelude.IsString

type Apply (FromString_6989586621681391376Sym0 :: TyFun Symbol (Const a6989586621681391349 b6989586621681391350) -> Type) (a6989586621681391375 :: Symbol) = FromString_6989586621681391376 a6989586621681391375 :: Const a6989586621681391349 b6989586621681391350
type Rep (ElField '(s, a)) 
Instance details

Defined in Data.Vinyl.Functor

type Rep (ElField '(s, a)) = C1 ('MetaCons s 'PrefixI 'False) (Rec0 a)
type Apply UnwordsSym0 (a6989586621680321068 :: [Symbol]) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply UnwordsSym0 (a6989586621680321068 :: [Symbol]) = Unwords a6989586621680321068
type Apply UnlinesSym0 (a6989586621680321079 :: [Symbol]) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply UnlinesSym0 (a6989586621680321079 :: [Symbol]) = Unlines a6989586621680321079
type Apply (Let6989586621680321072GoSym2 ws6989586621680321071 w6989586621680321070 :: TyFun [Symbol] Symbol -> Type) (a6989586621680321073 :: [Symbol]) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (Let6989586621680321072GoSym2 ws6989586621680321071 w6989586621680321070 :: TyFun [Symbol] Symbol -> Type) (a6989586621680321073 :: [Symbol]) = Let6989586621680321072Go ws6989586621680321071 w6989586621680321070 a6989586621680321073
type Apply (Let6989586621680577804ShowlSym4 s6989586621680577803 xs6989586621680577802 x6989586621680577801 showx6989586621680577800 :: TyFun [k1] Symbol -> Type) (a6989586621680577805 :: [k1]) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (Let6989586621680577804ShowlSym4 s6989586621680577803 xs6989586621680577802 x6989586621680577801 showx6989586621680577800 :: TyFun [k1] Symbol -> Type) (a6989586621680577805 :: [k1]) = Let6989586621680577804Showl s6989586621680577803 xs6989586621680577802 x6989586621680577801 showx6989586621680577800 a6989586621680577805
type Apply Show_tupleSym0 (a6989586621680577725 :: [Symbol ~> Symbol]) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply Show_tupleSym0 (a6989586621680577725 :: [Symbol ~> Symbol]) = Show_tupleSym1 a6989586621680577725
type Apply (ShowList_6989586621680577858Sym0 :: TyFun [a6989586621680577383] (Symbol ~> Symbol) -> Type) (a6989586621680577856 :: [a6989586621680577383]) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowList_6989586621680577858Sym0 :: TyFun [a6989586621680577383] (Symbol ~> Symbol) -> Type) (a6989586621680577856 :: [a6989586621680577383]) = ShowList_6989586621680577858Sym1 a6989586621680577856
type Apply (ShowListSym0 :: TyFun [a6989586621680577383] (Symbol ~> Symbol) -> Type) (arg6989586621680577829 :: [a6989586621680577383]) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowListSym0 :: TyFun [a6989586621680577383] (Symbol ~> Symbol) -> Type) (arg6989586621680577829 :: [a6989586621680577383]) = ShowListSym1 arg6989586621680577829
type Apply (ShowListWithSym1 a6989586621680577793 :: TyFun [a6989586621680577367] (Symbol ~> Symbol) -> Type) (a6989586621680577794 :: [a6989586621680577367]) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowListWithSym1 a6989586621680577793 :: TyFun [a6989586621680577367] (Symbol ~> Symbol) -> Type) (a6989586621680577794 :: [a6989586621680577367]) = ShowListWithSym2 a6989586621680577793 a6989586621680577794
type Apply (ShowsPrec_6989586621680577871Sym1 a6989586621680577868 a6989586621680577401 :: TyFun [a6989586621680577401] (Symbol ~> Symbol) -> Type) (a6989586621680577869 :: [a6989586621680577401]) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680577871Sym1 a6989586621680577868 a6989586621680577401 :: TyFun [a6989586621680577401] (Symbol ~> Symbol) -> Type) (a6989586621680577869 :: [a6989586621680577401]) = ShowsPrec_6989586621680577871Sym2 a6989586621680577868 a6989586621680577869
type Apply (ShowsPrec_6989586621680595739Sym1 a6989586621680595736 a3530822107858468865 :: TyFun (Maybe a3530822107858468865) (Symbol ~> Symbol) -> Type) (a6989586621680595737 :: Maybe a3530822107858468865) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680595739Sym1 a6989586621680595736 a3530822107858468865 :: TyFun (Maybe a3530822107858468865) (Symbol ~> Symbol) -> Type) (a6989586621680595737 :: Maybe a3530822107858468865) = ShowsPrec_6989586621680595739Sym2 a6989586621680595736 a6989586621680595737
type Apply (ShowsPrec_6989586621681091374Sym1 a6989586621681091371 a6989586621679060072 :: TyFun (Min a6989586621679060072) (Symbol ~> Symbol) -> Type) (a6989586621681091372 :: Min a6989586621679060072) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ShowsPrec_6989586621681091374Sym1 a6989586621681091371 a6989586621679060072 :: TyFun (Min a6989586621679060072) (Symbol ~> Symbol) -> Type) (a6989586621681091372 :: Min a6989586621679060072) = ShowsPrec_6989586621681091374Sym2 a6989586621681091371 a6989586621681091372
type Apply (ShowsPrec_6989586621681091405Sym1 a6989586621681091402 a6989586621679060077 :: TyFun (Max a6989586621679060077) (Symbol ~> Symbol) -> Type) (a6989586621681091403 :: Max a6989586621679060077) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ShowsPrec_6989586621681091405Sym1 a6989586621681091402 a6989586621679060077 :: TyFun (Max a6989586621679060077) (Symbol ~> Symbol) -> Type) (a6989586621681091403 :: Max a6989586621679060077) = ShowsPrec_6989586621681091405Sym2 a6989586621681091402 a6989586621681091403
type Apply (ShowsPrec_6989586621681091436Sym1 a6989586621681091433 a6989586621679060087 :: TyFun (First a6989586621679060087) (Symbol ~> Symbol) -> Type) (a6989586621681091434 :: First a6989586621679060087) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ShowsPrec_6989586621681091436Sym1 a6989586621681091433 a6989586621679060087 :: TyFun (First a6989586621679060087) (Symbol ~> Symbol) -> Type) (a6989586621681091434 :: First a6989586621679060087) = ShowsPrec_6989586621681091436Sym2 a6989586621681091433 a6989586621681091434
type Apply (ShowsPrec_6989586621681091467Sym1 a6989586621681091464 a6989586621679060082 :: TyFun (Last a6989586621679060082) (Symbol ~> Symbol) -> Type) (a6989586621681091465 :: Last a6989586621679060082) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ShowsPrec_6989586621681091467Sym1 a6989586621681091464 a6989586621679060082 :: TyFun (Last a6989586621679060082) (Symbol ~> Symbol) -> Type) (a6989586621681091465 :: Last a6989586621679060082) = ShowsPrec_6989586621681091467Sym2 a6989586621681091464 a6989586621681091465
type Apply (ShowsPrec_6989586621681091498Sym1 a6989586621681091495 m6989586621679090734 :: TyFun (WrappedMonoid m6989586621679090734) (Symbol ~> Symbol) -> Type) (a6989586621681091496 :: WrappedMonoid m6989586621679090734) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ShowsPrec_6989586621681091498Sym1 a6989586621681091495 m6989586621679090734 :: TyFun (WrappedMonoid m6989586621679090734) (Symbol ~> Symbol) -> Type) (a6989586621681091496 :: WrappedMonoid m6989586621679090734) = ShowsPrec_6989586621681091498Sym2 a6989586621681091495 a6989586621681091496
type Apply (ShowsPrec_6989586621681091194Sym1 a6989586621681091191 a6989586621679060067 :: TyFun (Option a6989586621679060067) (Symbol ~> Symbol) -> Type) (a6989586621681091192 :: Option a6989586621679060067) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ShowsPrec_6989586621681091194Sym1 a6989586621681091191 a6989586621679060067 :: TyFun (Option a6989586621679060067) (Symbol ~> Symbol) -> Type) (a6989586621681091192 :: Option a6989586621679060067) = ShowsPrec_6989586621681091194Sym2 a6989586621681091191 a6989586621681091192
type Apply (ShowsPrec_6989586621680921160Sym1 a6989586621680921157 a6989586621680920941 :: TyFun (Identity a6989586621680920941) (Symbol ~> Symbol) -> Type) (a6989586621680921158 :: Identity a6989586621680920941) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type Apply (ShowsPrec_6989586621680921160Sym1 a6989586621680921157 a6989586621680920941 :: TyFun (Identity a6989586621680920941) (Symbol ~> Symbol) -> Type) (a6989586621680921158 :: Identity a6989586621680920941) = ShowsPrec_6989586621680921160Sym2 a6989586621680921157 a6989586621680921158
type Apply (ShowsPrec_6989586621680637784Sym1 a6989586621680637781 a6989586621679087428 :: TyFun (First a6989586621679087428) (Symbol ~> Symbol) -> Type) (a6989586621680637782 :: First a6989586621679087428) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (ShowsPrec_6989586621680637784Sym1 a6989586621680637781 a6989586621679087428 :: TyFun (First a6989586621679087428) (Symbol ~> Symbol) -> Type) (a6989586621680637782 :: First a6989586621679087428) = ShowsPrec_6989586621680637784Sym2 a6989586621680637781 a6989586621680637782
type Apply (ShowsPrec_6989586621680637815Sym1 a6989586621680637812 a6989586621679087421 :: TyFun (Last a6989586621679087421) (Symbol ~> Symbol) -> Type) (a6989586621680637813 :: Last a6989586621679087421) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (ShowsPrec_6989586621680637815Sym1 a6989586621680637812 a6989586621679087421 :: TyFun (Last a6989586621679087421) (Symbol ~> Symbol) -> Type) (a6989586621680637813 :: Last a6989586621679087421) = ShowsPrec_6989586621680637815Sym2 a6989586621680637812 a6989586621680637813
type Apply (ShowsPrec_6989586621681091225Sym1 a6989586621681091222 a6989586621679087487 :: TyFun (Dual a6989586621679087487) (Symbol ~> Symbol) -> Type) (a6989586621681091223 :: Dual a6989586621679087487) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ShowsPrec_6989586621681091225Sym1 a6989586621681091222 a6989586621679087487 :: TyFun (Dual a6989586621679087487) (Symbol ~> Symbol) -> Type) (a6989586621681091223 :: Dual a6989586621679087487) = ShowsPrec_6989586621681091225Sym2 a6989586621681091222 a6989586621681091223
type Apply (ShowsPrec_6989586621681091312Sym1 a6989586621681091309 a6989586621679087464 :: TyFun (Sum a6989586621679087464) (Symbol ~> Symbol) -> Type) (a6989586621681091310 :: Sum a6989586621679087464) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ShowsPrec_6989586621681091312Sym1 a6989586621681091309 a6989586621679087464 :: TyFun (Sum a6989586621679087464) (Symbol ~> Symbol) -> Type) (a6989586621681091310 :: Sum a6989586621679087464) = ShowsPrec_6989586621681091312Sym2 a6989586621681091309 a6989586621681091310
type Apply (ShowsPrec_6989586621681091343Sym1 a6989586621681091340 a6989586621679087472 :: TyFun (Product a6989586621679087472) (Symbol ~> Symbol) -> Type) (a6989586621681091341 :: Product a6989586621679087472) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ShowsPrec_6989586621681091343Sym1 a6989586621681091340 a6989586621679087472 :: TyFun (Product a6989586621679087472) (Symbol ~> Symbol) -> Type) (a6989586621681091341 :: Product a6989586621679087472) = ShowsPrec_6989586621681091343Sym2 a6989586621681091340 a6989586621681091341
type Apply (ShowsPrec_6989586621680595837Sym1 a6989586621680595834 a6989586621679060153 :: TyFun (NonEmpty a6989586621679060153) (Symbol ~> Symbol) -> Type) (a6989586621680595835 :: NonEmpty a6989586621679060153) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680595837Sym1 a6989586621680595834 a6989586621679060153 :: TyFun (NonEmpty a6989586621679060153) (Symbol ~> Symbol) -> Type) (a6989586621680595835 :: NonEmpty a6989586621679060153) = ShowsPrec_6989586621680595837Sym2 a6989586621680595834 a6989586621680595835
type HKD ElField ('(s, a) :: (Symbol, Type)) 
Instance details

Defined in Data.Vinyl.XRec

type HKD ElField ('(s, a) :: (Symbol, Type)) = a
type RecElemFCtx (SRec :: ((Symbol, Type) -> Type) -> [(Symbol, Type)] -> Type) (f :: (Symbol, Type) -> Type) 
Instance details

Defined in Data.Vinyl.SRec

type RecElemFCtx (SRec :: ((Symbol, Type) -> Type) -> [(Symbol, Type)] -> Type) (f :: (Symbol, Type) -> Type) = f ~ ElField
type RecElemFCtx (SRec2 ElField) (f :: (Symbol, Type) -> Type) 
Instance details

Defined in Data.Vinyl.SRec

type RecElemFCtx (SRec2 ElField) (f :: (Symbol, Type) -> Type) = f ~ ElField
type Apply (ShowParenSym1 a6989586621680577759 :: TyFun (Symbol ~> Symbol) (Symbol ~> Symbol) -> Type) (a6989586621680577760 :: Symbol ~> Symbol) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowParenSym1 a6989586621680577759 :: TyFun (Symbol ~> Symbol) (Symbol ~> Symbol) -> Type) (a6989586621680577760 :: Symbol ~> Symbol) = ShowParenSym2 a6989586621680577759 a6989586621680577760
type Apply (ShowListWithSym0 :: TyFun (a6989586621680577367 ~> (Symbol ~> Symbol)) ([a6989586621680577367] ~> (Symbol ~> Symbol)) -> Type) (a6989586621680577793 :: a6989586621680577367 ~> (Symbol ~> Symbol)) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowListWithSym0 :: TyFun (a6989586621680577367 ~> (Symbol ~> Symbol)) ([a6989586621680577367] ~> (Symbol ~> Symbol)) -> Type) (a6989586621680577793 :: a6989586621680577367 ~> (Symbol ~> Symbol)) = ShowListWithSym1 a6989586621680577793
type RecSubsetFCtx (SRec :: ((Symbol, Type) -> Type) -> [(Symbol, Type)] -> Type) (f :: (Symbol, Type) -> Type) 
Instance details

Defined in Data.Vinyl.SRec

type RecSubsetFCtx (SRec :: ((Symbol, Type) -> Type) -> [(Symbol, Type)] -> Type) (f :: (Symbol, Type) -> Type) = f ~ ElField
type RecSubsetFCtx (SRec2 ElField) (f :: (Symbol, Type) -> Type) 
Instance details

Defined in Data.Vinyl.SRec

type RecSubsetFCtx (SRec2 ElField) (f :: (Symbol, Type) -> Type) = f ~ ElField
type Apply (ShowsPrec_6989586621680595795Sym1 a6989586621680595792 a6989586621679091042 b6989586621679091043 :: TyFun (Either a6989586621679091042 b6989586621679091043) (Symbol ~> Symbol) -> Type) (a6989586621680595793 :: Either a6989586621679091042 b6989586621679091043) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680595795Sym1 a6989586621680595792 a6989586621679091042 b6989586621679091043 :: TyFun (Either a6989586621679091042 b6989586621679091043) (Symbol ~> Symbol) -> Type) (a6989586621680595793 :: Either a6989586621679091042 b6989586621679091043) = ShowsPrec_6989586621680595795Sym2 a6989586621680595792 a6989586621680595793
type Apply (ShowsPrec_6989586621680577911Sym1 a6989586621680577908 a6989586621680577405 b6989586621680577406 :: TyFun (a6989586621680577405, b6989586621680577406) (Symbol ~> Symbol) -> Type) (a6989586621680577909 :: (a6989586621680577405, b6989586621680577406)) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680577911Sym1 a6989586621680577908 a6989586621680577405 b6989586621680577406 :: TyFun (a6989586621680577405, b6989586621680577406) (Symbol ~> Symbol) -> Type) (a6989586621680577909 :: (a6989586621680577405, b6989586621680577406)) = ShowsPrec_6989586621680577911Sym2 a6989586621680577908 a6989586621680577909
type Apply (ShowsPrec_6989586621681108427Sym1 a6989586621681108424 a6989586621681107144 b6989586621681107145 :: TyFun (Arg a6989586621681107144 b6989586621681107145) (Symbol ~> Symbol) -> Type) (a6989586621681108425 :: Arg a6989586621681107144 b6989586621681107145) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ShowsPrec_6989586621681108427Sym1 a6989586621681108424 a6989586621681107144 b6989586621681107145 :: TyFun (Arg a6989586621681107144 b6989586621681107145) (Symbol ~> Symbol) -> Type) (a6989586621681108425 :: Arg a6989586621681107144 b6989586621681107145) = ShowsPrec_6989586621681108427Sym2 a6989586621681108424 a6989586621681108425
type Apply (Let6989586621680577804ShowlSym0 :: TyFun (k1 ~> (Symbol ~> Symbol)) (TyFun k2 (TyFun k3 (TyFun Symbol (TyFun [k1] Symbol -> Type) -> Type) -> Type) -> Type) -> Type) (showx6989586621680577800 :: k1 ~> (Symbol ~> Symbol)) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (Let6989586621680577804ShowlSym0 :: TyFun (k1 ~> (Symbol ~> Symbol)) (TyFun k2 (TyFun k3 (TyFun Symbol (TyFun [k1] Symbol -> Type) -> Type) -> Type) -> Type) -> Type) (showx6989586621680577800 :: k1 ~> (Symbol ~> Symbol)) = Let6989586621680577804ShowlSym1 showx6989586621680577800 :: TyFun k2 (TyFun k3 (TyFun Symbol (TyFun [k1] Symbol -> Type) -> Type) -> Type) -> Type
type Apply (Lambda_6989586621680577733Sym2 a_69895866216805777296989586621680577732 ss6989586621680577731 :: TyFun (Symbol ~> c6989586621679941607) (TyFun (a6989586621679941608 ~> Symbol) (TyFun a6989586621679941608 c6989586621679941607 -> Type) -> Type) -> Type) (t6989586621680577737 :: Symbol ~> c6989586621679941607) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (Lambda_6989586621680577733Sym2 a_69895866216805777296989586621680577732 ss6989586621680577731 :: TyFun (Symbol ~> c6989586621679941607) (TyFun (a6989586621679941608 ~> Symbol) (TyFun a6989586621679941608 c6989586621679941607 -> Type) -> Type) -> Type) (t6989586621680577737 :: Symbol ~> c6989586621679941607) = Lambda_6989586621680577733Sym3 a_69895866216805777296989586621680577732 ss6989586621680577731 t6989586621680577737 :: TyFun (a6989586621679941608 ~> Symbol) (TyFun a6989586621679941608 c6989586621679941607 -> Type) -> Type
type Apply (Lambda_6989586621680577733Sym3 t6989586621680577737 a_69895866216805777296989586621680577732 ss6989586621680577731 :: TyFun (a6989586621679941608 ~> Symbol) (TyFun a6989586621679941608 c6989586621679941607 -> Type) -> Type) (t6989586621680577738 :: a6989586621679941608 ~> Symbol) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (Lambda_6989586621680577733Sym3 t6989586621680577737 a_69895866216805777296989586621680577732 ss6989586621680577731 :: TyFun (a6989586621679941608 ~> Symbol) (TyFun a6989586621679941608 c6989586621679941607 -> Type) -> Type) (t6989586621680577738 :: a6989586621679941608 ~> Symbol) = Lambda_6989586621680577733 t6989586621680577737 a_69895866216805777296989586621680577732 ss6989586621680577731 t6989586621680577738
type Apply (ShowsPrec_6989586621680577928Sym1 a6989586621680577925 a6989586621680577410 b6989586621680577411 c6989586621680577412 :: TyFun (a6989586621680577410, b6989586621680577411, c6989586621680577412) (Symbol ~> Symbol) -> Type) (a6989586621680577926 :: (a6989586621680577410, b6989586621680577411, c6989586621680577412)) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680577928Sym1 a6989586621680577925 a6989586621680577410 b6989586621680577411 c6989586621680577412 :: TyFun (a6989586621680577410, b6989586621680577411, c6989586621680577412) (Symbol ~> Symbol) -> Type) (a6989586621680577926 :: (a6989586621680577410, b6989586621680577411, c6989586621680577412)) = ShowsPrec_6989586621680577928Sym2 a6989586621680577925 a6989586621680577926
type Apply (ShowsPrec_6989586621680953659Sym1 a6989586621680953656 a6989586621680952802 b6989586621680952803 :: TyFun (Const a6989586621680952802 b6989586621680952803) (Symbol ~> Symbol) -> Type) (a6989586621680953657 :: Const a6989586621680952802 b6989586621680952803) 
Instance details

Defined in Data.Singletons.Prelude.Const

type Apply (ShowsPrec_6989586621680953659Sym1 a6989586621680953656 a6989586621680952802 b6989586621680952803 :: TyFun (Const a6989586621680952802 b6989586621680952803) (Symbol ~> Symbol) -> Type) (a6989586621680953657 :: Const a6989586621680952802 b6989586621680952803) = ShowsPrec_6989586621680953659Sym2 a6989586621680953656 a6989586621680953657
type Apply (ShowsPrec_6989586621680577946Sym1 a6989586621680577943 a6989586621680577417 b6989586621680577418 c6989586621680577419 d6989586621680577420 :: TyFun (a6989586621680577417, b6989586621680577418, c6989586621680577419, d6989586621680577420) (Symbol ~> Symbol) -> Type) (a6989586621680577944 :: (a6989586621680577417, b6989586621680577418, c6989586621680577419, d6989586621680577420)) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680577946Sym1 a6989586621680577943 a6989586621680577417 b6989586621680577418 c6989586621680577419 d6989586621680577420 :: TyFun (a6989586621680577417, b6989586621680577418, c6989586621680577419, d6989586621680577420) (Symbol ~> Symbol) -> Type) (a6989586621680577944 :: (a6989586621680577417, b6989586621680577418, c6989586621680577419, d6989586621680577420)) = ShowsPrec_6989586621680577946Sym2 a6989586621680577943 a6989586621680577944
type Apply (ShowsPrec_6989586621680577965Sym1 a6989586621680577962 a6989586621680577426 b6989586621680577427 c6989586621680577428 d6989586621680577429 e6989586621680577430 :: TyFun (a6989586621680577426, b6989586621680577427, c6989586621680577428, d6989586621680577429, e6989586621680577430) (Symbol ~> Symbol) -> Type) (a6989586621680577963 :: (a6989586621680577426, b6989586621680577427, c6989586621680577428, d6989586621680577429, e6989586621680577430)) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680577965Sym1 a6989586621680577962 a6989586621680577426 b6989586621680577427 c6989586621680577428 d6989586621680577429 e6989586621680577430 :: TyFun (a6989586621680577426, b6989586621680577427, c6989586621680577428, d6989586621680577429, e6989586621680577430) (Symbol ~> Symbol) -> Type) (a6989586621680577963 :: (a6989586621680577426, b6989586621680577427, c6989586621680577428, d6989586621680577429, e6989586621680577430)) = ShowsPrec_6989586621680577965Sym2 a6989586621680577962 a6989586621680577963
type Apply (ShowsPrec_6989586621680577985Sym1 a6989586621680577982 a6989586621680577437 b6989586621680577438 c6989586621680577439 d6989586621680577440 e6989586621680577441 f6989586621680577442 :: TyFun (a6989586621680577437, b6989586621680577438, c6989586621680577439, d6989586621680577440, e6989586621680577441, f6989586621680577442) (Symbol ~> Symbol) -> Type) (a6989586621680577983 :: (a6989586621680577437, b6989586621680577438, c6989586621680577439, d6989586621680577440, e6989586621680577441, f6989586621680577442)) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680577985Sym1 a6989586621680577982 a6989586621680577437 b6989586621680577438 c6989586621680577439 d6989586621680577440 e6989586621680577441 f6989586621680577442 :: TyFun (a6989586621680577437, b6989586621680577438, c6989586621680577439, d6989586621680577440, e6989586621680577441, f6989586621680577442) (Symbol ~> Symbol) -> Type) (a6989586621680577983 :: (a6989586621680577437, b6989586621680577438, c6989586621680577439, d6989586621680577440, e6989586621680577441, f6989586621680577442)) = ShowsPrec_6989586621680577985Sym2 a6989586621680577982 a6989586621680577983
type Apply (ShowsPrec_6989586621680578006Sym1 a6989586621680578003 a6989586621680577450 b6989586621680577451 c6989586621680577452 d6989586621680577453 e6989586621680577454 f6989586621680577455 g6989586621680577456 :: TyFun (a6989586621680577450, b6989586621680577451, c6989586621680577452, d6989586621680577453, e6989586621680577454, f6989586621680577455, g6989586621680577456) (Symbol ~> Symbol) -> Type) (a6989586621680578004 :: (a6989586621680577450, b6989586621680577451, c6989586621680577452, d6989586621680577453, e6989586621680577454, f6989586621680577455, g6989586621680577456)) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680578006Sym1 a6989586621680578003 a6989586621680577450 b6989586621680577451 c6989586621680577452 d6989586621680577453 e6989586621680577454 f6989586621680577455 g6989586621680577456 :: TyFun (a6989586621680577450, b6989586621680577451, c6989586621680577452, d6989586621680577453, e6989586621680577454, f6989586621680577455, g6989586621680577456) (Symbol ~> Symbol) -> Type) (a6989586621680578004 :: (a6989586621680577450, b6989586621680577451, c6989586621680577452, d6989586621680577453, e6989586621680577454, f6989586621680577455, g6989586621680577456)) = ShowsPrec_6989586621680578006Sym2 a6989586621680578003 a6989586621680578004

class KnownSymbol (n :: Symbol) #

This class gives the string associated with a type-level symbol. There are instances of the class for every concrete literal: "hello", etc.

Since: base-4.7.0.0

Minimal complete definition

symbolSing

type family AppendSymbol (a :: Symbol) (b :: Symbol) :: Symbol where ... #

Concatenation of type-level symbols.

Since: base-4.10.0.0

symbolVal :: forall (n :: Symbol) proxy. KnownSymbol n => proxy n -> String #

Since: base-4.7.0.0

symbolValT :: forall s. KnownSymbol s => Proxy s -> Text Source #

symbolValT' :: forall s. KnownSymbol s => Text Source #

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

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

data ErrorMessage #

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 family TypeErrorUnless (cond :: Bool) (err :: ErrorMessage) :: Constraint where ... Source #

Conditional type error.

Note that TypeErrorUnless cond err is the same as If cond () (TypeError err), but does not produce type-level error when one of its arguments cannot be deduced.

Equations

TypeErrorUnless 'True _ = () 
TypeErrorUnless 'False err = TypeError err 

inTypeErrorUnless :: forall cond err a. TypeErrorUnless cond err => (cond ~ 'True => a) -> a Source #

Reify the fact that condition under TypeErrorUnless constraint can be assumed to always hold.