isobmff-0.13.0.0: A parser and generator for the ISO-14496-12/14 base media file format

Safe HaskellNone
LanguageHaskell2010

Data.ByteString.IsoBaseFileFormat.ReExports

Contents

Description

A module of re-exports and orphan instances

Synopsis

Documentation

trace :: String -> a -> a #

The trace function outputs the trace message given as its first argument, before returning the second argument as its result.

For example, this returns the value of f x but first outputs the message.

>>> let x = 123; f = show
>>> trace ("calling f with x = " ++ show x) (f x)
"calling f with x = 123
123"

The trace function should only be used for debugging, or for monitoring execution. The function is not referentially transparent: its type indicates that it is a pure function but it has the side effect of outputting the trace message.

class IsString a where #

Class for string-like datastructures; used by the overloaded string extension (-XOverloadedStrings in GHC).

Methods

fromString :: String -> a #

Instances
IsString ShortByteString 
Instance details

Defined in Data.ByteString.Short.Internal

IsString ByteString 
Instance details

Defined in Data.ByteString.Lazy.Internal

IsString ByteString 
Instance details

Defined in Data.ByteString.Internal

IsString Doc 
Instance details

Defined in Text.PrettyPrint.HughesPJ

Methods

fromString :: String -> Doc #

IsString FourCc Source # 
Instance details

Defined in Data.ByteString.IsoBaseFileFormat.Box

Methods

fromString :: String -> FourCc #

IsString Language Source # 
Instance details

Defined in Data.ByteString.IsoBaseFileFormat.Boxes.Language

a ~ Char => IsString [a]

(a ~ Char) context was introduced in 4.9.0.0

Since: base-2.1

Instance details

Defined in Data.String

Methods

fromString :: String -> [a] #

IsString a => IsString (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.String

Methods

fromString :: String -> Identity a #

a ~ Char => IsString (Seq a)

Since: containers-0.5.7

Instance details

Defined in Data.Sequence.Internal

Methods

fromString :: String -> Seq a #

a ~ Char => IsString (DList a) 
Instance details

Defined in Data.DList

Methods

fromString :: String -> DList a #

IsString (Doc a) 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Methods

fromString :: String -> Doc a #

IsString (U32Text label) Source # 
Instance details

Defined in Data.ByteString.IsoBaseFileFormat.Util.BoxFields

Methods

fromString :: String -> U32Text label #

IsString a => IsString (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.String

Methods

fromString :: String -> Const a b #

IsString a => IsString (Tagged s a) 
Instance details

Defined in Data.Tagged

Methods

fromString :: String -> Tagged s a #

fold :: (Foldable t, Monoid m) => t m -> m #

Combine the elements of a structure using a monoid.

class KnownNat (n :: Nat) #

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

Since: base-4.7.0.0

Minimal complete definition

natSing

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

(<>) :: Semigroup a => a -> a -> a infixr 6 #

An associative operation.

class Semigroup a => Monoid a where #

The class of monoids (types with an associative binary operation that has an identity). Instances should satisfy the following laws:

The method names refer to the monoid of lists under concatenation, but there are many other instances.

Some types can be viewed as a monoid in more than one way, e.g. both addition and multiplication on numbers. In such cases we often define newtypes and make those instances of Monoid, e.g. Sum and Product.

NOTE: Semigroup is a superclass of Monoid since base-4.11.0.0.

Minimal complete definition

mempty

Methods

mempty :: a #

Identity of mappend

mappend :: a -> a -> a #

An associative operation

NOTE: This method is redundant and has the default implementation mappend = '(<>)' since base-4.11.0.0.

mconcat :: [a] -> a #

Fold a list using the monoid.

For most types, the default definition for mconcat will be used, but the function is included in the class definition so that an optimized version can be provided for specific types.

Instances
Monoid Ordering

Since: base-2.1

Instance details

Defined in GHC.Base

Monoid ()

Since: base-2.1

Instance details

Defined in GHC.Base

Methods

mempty :: () #

mappend :: () -> () -> () #

mconcat :: [()] -> () #

Monoid All

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Methods

mempty :: All #

mappend :: All -> All -> All #

mconcat :: [All] -> All #

Monoid Any

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Methods

mempty :: Any #

mappend :: Any -> Any -> Any #

mconcat :: [Any] -> Any #

Monoid ShortByteString 
Instance details

Defined in Data.ByteString.Short.Internal

Monoid ByteString 
Instance details

Defined in Data.ByteString.Lazy.Internal

Monoid ByteString 
Instance details

Defined in Data.ByteString.Internal

Monoid Builder 
Instance details

Defined in Data.ByteString.Builder.Internal

Monoid IntSet 
Instance details

Defined in Data.IntSet.Internal

Monoid Doc 
Instance details

Defined in Text.PrettyPrint.HughesPJ

Methods

mempty :: Doc #

mappend :: Doc -> Doc -> Doc #

mconcat :: [Doc] -> Doc #

Monoid ByteArray 
Instance details

Defined in Data.Primitive.ByteArray

Monoid PromDPatInfos 
Instance details

Defined in Data.Singletons.Syntax

Methods

mempty :: PromDPatInfos #

mappend :: PromDPatInfos -> PromDPatInfos -> PromDPatInfos #

mconcat :: [PromDPatInfos] -> PromDPatInfos #

Monoid ULetDecEnv 
Instance details

Defined in Data.Singletons.Syntax

Methods

mempty :: ULetDecEnv #

mappend :: ULetDecEnv -> ULetDecEnv -> ULetDecEnv #

mconcat :: [ULetDecEnv] -> ULetDecEnv #

Monoid BitStringBuilder Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

Monoid BuilderBox Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

Monoid [a]

Since: base-2.1

Instance details

Defined in GHC.Base

Methods

mempty :: [a] #

mappend :: [a] -> [a] -> [a] #

mconcat :: [[a]] -> [a] #

Semigroup a => Monoid (Maybe a)

Lift a semigroup into Maybe forming a Monoid according to http://en.wikipedia.org/wiki/Monoid: "Any semigroup S may be turned into a monoid simply by adjoining an element e not in S and defining e*e = e and e*s = s = s*e for all s ∈ S."

Since 4.11.0: constraint on inner a value generalised from Monoid to Semigroup.

Since: base-2.1

Instance details

Defined in GHC.Base

Methods

mempty :: Maybe a #

mappend :: Maybe a -> Maybe a -> Maybe a #

mconcat :: [Maybe a] -> Maybe a #

Monoid a => Monoid (IO a)

Since: base-4.9.0.0

Instance details

Defined in GHC.Base

Methods

mempty :: IO a #

mappend :: IO a -> IO a -> IO a #

mconcat :: [IO a] -> IO a #

Monoid p => Monoid (Par1 p)

Since: base-4.12.0.0

Instance details

Defined in GHC.Generics

Methods

mempty :: Par1 p #

mappend :: Par1 p -> Par1 p -> Par1 p #

mconcat :: [Par1 p] -> Par1 p #

(Ord a, Bounded a) => Monoid (Min a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

mempty :: Min a #

mappend :: Min a -> Min a -> Min a #

mconcat :: [Min a] -> Min a #

(Ord a, Bounded a) => Monoid (Max a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

mempty :: Max a #

mappend :: Max a -> Max a -> Max a #

mconcat :: [Max a] -> Max a #

Monoid m => Monoid (WrappedMonoid m)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Semigroup a => Monoid (Option a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

mempty :: Option a #

mappend :: Option a -> Option a -> Option a #

mconcat :: [Option a] -> Option a #

Monoid a => Monoid (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

Methods

mempty :: Identity a #

mappend :: Identity a -> Identity a -> Identity a #

mconcat :: [Identity a] -> Identity a #

Monoid (First a)

Since: base-2.1

Instance details

Defined in Data.Monoid

Methods

mempty :: First a #

mappend :: First a -> First a -> First a #

mconcat :: [First a] -> First a #

Monoid (Last a)

Since: base-2.1

Instance details

Defined in Data.Monoid

Methods

mempty :: Last a #

mappend :: Last a -> Last a -> Last a #

mconcat :: [Last a] -> Last a #

Monoid a => Monoid (Dual a)

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Methods

mempty :: Dual a #

mappend :: Dual a -> Dual a -> Dual a #

mconcat :: [Dual a] -> Dual a #

Monoid (Endo a)

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Methods

mempty :: Endo a #

mappend :: Endo a -> Endo a -> Endo a #

mconcat :: [Endo a] -> Endo a #

Num a => Monoid (Sum a)

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Methods

mempty :: Sum a #

mappend :: Sum a -> Sum a -> Sum a #

mconcat :: [Sum a] -> Sum a #

Num a => Monoid (Product a)

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Methods

mempty :: Product a #

mappend :: Product a -> Product a -> Product a #

mconcat :: [Product a] -> Product a #

Monoid a => Monoid (Down a)

Since: base-4.11.0.0

Instance details

Defined in Data.Ord

Methods

mempty :: Down a #

mappend :: Down a -> Down a -> Down a #

mconcat :: [Down a] -> Down a #

Monoid (IntMap a) 
Instance details

Defined in Data.IntMap.Internal

Methods

mempty :: IntMap a #

mappend :: IntMap a -> IntMap a -> IntMap a #

mconcat :: [IntMap a] -> IntMap a #

Monoid (Seq a) 
Instance details

Defined in Data.Sequence.Internal

Methods

mempty :: Seq a #

mappend :: Seq a -> Seq a -> Seq a #

mconcat :: [Seq a] -> Seq a #

Ord a => Monoid (Set a) 
Instance details

Defined in Data.Set.Internal

Methods

mempty :: Set a #

mappend :: Set a -> Set a -> Set a #

mconcat :: [Set a] -> Set a #

Monoid (DList a) 
Instance details

Defined in Data.DList

Methods

mempty :: DList a #

mappend :: DList a -> DList a -> DList a #

mconcat :: [DList a] -> DList a #

Monoid (Doc a) 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Methods

mempty :: Doc a #

mappend :: Doc a -> Doc a -> Doc a #

mconcat :: [Doc a] -> Doc a #

PrimUnlifted a => Monoid (UnliftedArray a)

Since: primitive-0.6.4.0

Instance details

Defined in Data.Primitive.UnliftedArray

Monoid (PrimArray a)

Since: primitive-0.6.4.0

Instance details

Defined in Data.Primitive.PrimArray

Monoid (SmallArray a) 
Instance details

Defined in Data.Primitive.SmallArray

Monoid (Array a) 
Instance details

Defined in Data.Primitive.Array

Methods

mempty :: Array a #

mappend :: Array a -> Array a -> Array a #

mconcat :: [Array a] -> Array a #

Storable a => Monoid (Vector a) 
Instance details

Defined in Data.Vector.Storable

Methods

mempty :: Vector a #

mappend :: Vector a -> Vector a -> Vector a #

mconcat :: [Vector a] -> Vector a #

Prim a => Monoid (Vector a) 
Instance details

Defined in Data.Vector.Primitive

Methods

mempty :: Vector a #

mappend :: Vector a -> Vector a -> Vector a #

mconcat :: [Vector a] -> Vector a #

Monoid (Vector a) 
Instance details

Defined in Data.Vector

Methods

mempty :: Vector a #

mappend :: Vector a -> Vector a -> Vector a #

mconcat :: [Vector a] -> Vector a #

Monoid (MergeSet a) 
Instance details

Defined in Data.Set.Internal

Methods

mempty :: MergeSet a #

mappend :: MergeSet a -> MergeSet a -> MergeSet a #

mconcat :: [MergeSet a] -> MergeSet a #

Monoid b => Monoid (a -> b)

Since: base-2.1

Instance details

Defined in GHC.Base

Methods

mempty :: a -> b #

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

mconcat :: [a -> b] -> a -> b #

Monoid (U1 p)

Since: base-4.12.0.0

Instance details

Defined in GHC.Generics

Methods

mempty :: U1 p #

mappend :: U1 p -> U1 p -> U1 p #

mconcat :: [U1 p] -> U1 p #

(Monoid a, Monoid b) => Monoid (a, b)

Since: base-2.1

Instance details

Defined in GHC.Base

Methods

mempty :: (a, b) #

mappend :: (a, b) -> (a, b) -> (a, b) #

mconcat :: [(a, b)] -> (a, b) #

Monoid (Proxy s)

Since: base-4.7.0.0

Instance details

Defined in Data.Proxy

Methods

mempty :: Proxy s #

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

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

Ord k => Monoid (Map k v) 
Instance details

Defined in Data.Map.Internal

Methods

mempty :: Map k v #

mappend :: Map k v -> Map k v -> Map k v #

mconcat :: [Map k v] -> Map k v #

Monoid (f p) => Monoid (Rec1 f p)

Since: base-4.12.0.0

Instance details

Defined in GHC.Generics

Methods

mempty :: Rec1 f p #

mappend :: Rec1 f p -> Rec1 f p -> Rec1 f p #

mconcat :: [Rec1 f p] -> Rec1 f p #

(Monoid a, Monoid b, Monoid c) => Monoid (a, b, c)

Since: base-2.1

Instance details

Defined in GHC.Base

Methods

mempty :: (a, b, c) #

mappend :: (a, b, c) -> (a, b, c) -> (a, b, c) #

mconcat :: [(a, b, c)] -> (a, b, c) #

Monoid a => Monoid (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Methods

mempty :: Const a b #

mappend :: Const a b -> Const a b -> Const a b #

mconcat :: [Const a b] -> Const a b #

(Applicative f, Monoid a) => Monoid (Ap f a)

Since: base-4.12.0.0

Instance details

Defined in Data.Monoid

Methods

mempty :: Ap f a #

mappend :: Ap f a -> Ap f a -> Ap f a #

mconcat :: [Ap f a] -> Ap f a #

Alternative f => Monoid (Alt f a)

Since: base-4.8.0.0

Instance details

Defined in Data.Semigroup.Internal

Methods

mempty :: Alt f a #

mappend :: Alt f a -> Alt f a -> Alt f a #

mconcat :: [Alt f a] -> Alt f a #

Monoid m => Monoid (FunctionBuilder m r r)

Allow appending a FunctionBuilder to another without changing the resulting output function. For example, FunctionBuilders that have FunctionBuilder m r r can append something to m. It is not possible to add new parameters to the output function, this can only be done by the Category instance.

Instance details

Defined in Data.FunctionBuilder

(Semigroup a, Monoid a) => Monoid (Tagged s a) 
Instance details

Defined in Data.Tagged

Methods

mempty :: Tagged s a #

mappend :: Tagged s a -> Tagged s a -> Tagged s a #

mconcat :: [Tagged s a] -> Tagged s a #

Monoid c => Monoid (K1 i c p)

Since: base-4.12.0.0

Instance details

Defined in GHC.Generics

Methods

mempty :: K1 i c p #

mappend :: K1 i c p -> K1 i c p -> K1 i c p #

mconcat :: [K1 i c p] -> K1 i c p #

(Monoid (f p), Monoid (g p)) => Monoid ((f :*: g) p)

Since: base-4.12.0.0

Instance details

Defined in GHC.Generics

Methods

mempty :: (f :*: g) p #

mappend :: (f :*: g) p -> (f :*: g) p -> (f :*: g) p #

mconcat :: [(f :*: g) p] -> (f :*: g) p #

(Monoid a, Monoid b, Monoid c, Monoid d) => Monoid (a, b, c, d)

Since: base-2.1

Instance details

Defined in GHC.Base

Methods

mempty :: (a, b, c, d) #

mappend :: (a, b, c, d) -> (a, b, c, d) -> (a, b, c, d) #

mconcat :: [(a, b, c, d)] -> (a, b, c, d) #

Monoid (f p) => Monoid (M1 i c f p)

Since: base-4.12.0.0

Instance details

Defined in GHC.Generics

Methods

mempty :: M1 i c f p #

mappend :: M1 i c f p -> M1 i c f p -> M1 i c f p #

mconcat :: [M1 i c f p] -> M1 i c f p #

Monoid (f (g p)) => Monoid ((f :.: g) p)

Since: base-4.12.0.0

Instance details

Defined in GHC.Generics

Methods

mempty :: (f :.: g) p #

mappend :: (f :.: g) p -> (f :.: g) p -> (f :.: g) p #

mconcat :: [(f :.: g) p] -> (f :.: g) p #

(Monoid a, Monoid b, Monoid c, Monoid d, Monoid e) => Monoid (a, b, c, d, e)

Since: base-2.1

Instance details

Defined in GHC.Base

Methods

mempty :: (a, b, c, d, e) #

mappend :: (a, b, c, d, e) -> (a, b, c, d, e) -> (a, b, c, d, e) #

mconcat :: [(a, b, c, d, e)] -> (a, b, c, d, e) #

data Int #

A fixed-precision integer type with at least the range [-2^29 .. 2^29-1]. The exact range for a given implementation can be determined by using minBound and maxBound from the Bounded class.

Instances
Bounded Int

Since: base-2.1

Instance details

Defined in GHC.Enum

Methods

minBound :: Int #

maxBound :: Int #

Enum Int

Since: base-2.1

Instance details

Defined in GHC.Enum

Methods

succ :: Int -> Int #

pred :: Int -> Int #

toEnum :: Int -> Int #

fromEnum :: Int -> Int #

enumFrom :: Int -> [Int] #

enumFromThen :: Int -> Int -> [Int] #

enumFromTo :: Int -> Int -> [Int] #

enumFromThenTo :: Int -> Int -> Int -> [Int] #

Eq Int 
Instance details

Defined in GHC.Classes

Methods

(==) :: Int -> Int -> Bool #

(/=) :: Int -> Int -> Bool #

Integral Int

Since: base-2.0.1

Instance details

Defined in GHC.Real

Methods

quot :: Int -> Int -> Int #

rem :: Int -> Int -> Int #

div :: Int -> Int -> Int #

mod :: Int -> Int -> Int #

quotRem :: Int -> Int -> (Int, Int) #

divMod :: Int -> Int -> (Int, Int) #

toInteger :: Int -> Integer #

Num Int

Since: base-2.1

Instance details

Defined in GHC.Num

Methods

(+) :: Int -> Int -> Int #

(-) :: Int -> Int -> Int #

(*) :: Int -> Int -> Int #

negate :: Int -> Int #

abs :: Int -> Int #

signum :: Int -> Int #

fromInteger :: Integer -> Int #

Ord Int 
Instance details

Defined in GHC.Classes

Methods

compare :: Int -> Int -> Ordering #

(<) :: Int -> Int -> Bool #

(<=) :: Int -> Int -> Bool #

(>) :: Int -> Int -> Bool #

(>=) :: Int -> Int -> Bool #

max :: Int -> Int -> Int #

min :: Int -> Int -> Int #

Read Int

Since: base-2.1

Instance details

Defined in GHC.Read

Real Int

Since: base-2.0.1

Instance details

Defined in GHC.Real

Methods

toRational :: Int -> Rational #

Show Int

Since: base-2.1

Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> Int -> ShowS #

show :: Int -> String #

showList :: [Int] -> ShowS #

Ix Int

Since: base-2.1

Instance details

Defined in GHC.Arr

Methods

range :: (Int, Int) -> [Int] #

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

unsafeIndex :: (Int, Int) -> Int -> Int

inRange :: (Int, Int) -> Int -> Bool #

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

unsafeRangeSize :: (Int, Int) -> Int

Lift Int 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

lift :: Int -> Q Exp #

PrintfArg Int

Since: base-2.1

Instance details

Defined in Text.Printf

Storable Int

Since: base-2.1

Instance details

Defined in Foreign.Storable

Methods

sizeOf :: Int -> Int #

alignment :: Int -> Int #

peekElemOff :: Ptr Int -> Int -> IO Int #

pokeElemOff :: Ptr Int -> Int -> Int -> IO () #

peekByteOff :: Ptr b -> Int -> IO Int #

pokeByteOff :: Ptr b -> Int -> Int -> IO () #

peek :: Ptr Int -> IO Int #

poke :: Ptr Int -> Int -> IO () #

Bits Int

Since: base-2.1

Instance details

Defined in Data.Bits

Methods

(.&.) :: Int -> Int -> Int #

(.|.) :: Int -> Int -> Int #

xor :: Int -> Int -> Int #

complement :: Int -> Int #

shift :: Int -> Int -> Int #

rotate :: Int -> Int -> Int #

zeroBits :: Int #

bit :: Int -> Int #

setBit :: Int -> Int -> Int #

clearBit :: Int -> Int -> Int #

complementBit :: Int -> Int -> Int #

testBit :: Int -> Int -> Bool #

bitSizeMaybe :: Int -> Maybe Int #

bitSize :: Int -> Int #

isSigned :: Int -> Bool #

shiftL :: Int -> Int -> Int #

unsafeShiftL :: Int -> Int -> Int #

shiftR :: Int -> Int -> Int #

unsafeShiftR :: Int -> Int -> Int #

rotateL :: Int -> Int -> Int #

rotateR :: Int -> Int -> Int #

popCount :: Int -> Int #

FiniteBits Int

Since: base-4.6.0.0

Instance details

Defined in Data.Bits

Default Int 
Instance details

Defined in Data.Default.Class

Methods

def :: Int #

Prim Int 
Instance details

Defined in Data.Primitive.Types

Unbox Int 
Instance details

Defined in Data.Vector.Unboxed.Base

Vector Vector Int 
Instance details

Defined in Data.Vector.Unboxed.Base

MVector MVector Int 
Instance details

Defined in Data.Vector.Unboxed.Base

Generic1 (URec Int :: k -> Type) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep1 (URec Int) :: k -> Type #

Methods

from1 :: URec Int a -> Rep1 (URec Int) a #

to1 :: Rep1 (URec Int) a -> URec Int a #

Functor (URec Int :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

fmap :: (a -> b) -> URec Int a -> URec Int b #

(<$) :: a -> URec Int b -> URec Int a #

Foldable (URec Int :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => URec Int m -> m #

foldMap :: Monoid m => (a -> m) -> URec Int a -> m #

foldr :: (a -> b -> b) -> b -> URec Int a -> b #

foldr' :: (a -> b -> b) -> b -> URec Int a -> b #

foldl :: (b -> a -> b) -> b -> URec Int a -> b #

foldl' :: (b -> a -> b) -> b -> URec Int a -> b #

foldr1 :: (a -> a -> a) -> URec Int a -> a #

foldl1 :: (a -> a -> a) -> URec Int a -> a #

toList :: URec Int a -> [a] #

null :: URec Int a -> Bool #

length :: URec Int a -> Int #

elem :: Eq a => a -> URec Int a -> Bool #

maximum :: Ord a => URec Int a -> a #

minimum :: Ord a => URec Int a -> a #

sum :: Num a => URec Int a -> a #

product :: Num a => URec Int a -> a #

Traversable (URec Int :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Traversable

Methods

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

sequenceA :: Applicative f => URec Int (f a) -> f (URec Int a) #

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

sequence :: Monad m => URec Int (m a) -> m (URec Int a) #

Eq (URec Int p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

(==) :: URec Int p -> URec Int p -> Bool #

(/=) :: URec Int p -> URec Int p -> Bool #

Ord (URec Int p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

compare :: URec Int p -> URec Int p -> Ordering #

(<) :: URec Int p -> URec Int p -> Bool #

(<=) :: URec Int p -> URec Int p -> Bool #

(>) :: URec Int p -> URec Int p -> Bool #

(>=) :: URec Int p -> URec Int p -> Bool #

max :: URec Int p -> URec Int p -> URec Int p #

min :: URec Int p -> URec Int p -> URec Int p #

Show (URec Int p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

showsPrec :: Int -> URec Int p -> ShowS #

show :: URec Int p -> String #

showList :: [URec Int p] -> ShowS #

Generic (URec Int p) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (URec Int p) :: Type -> Type #

Methods

from :: URec Int p -> Rep (URec Int p) x #

to :: Rep (URec Int p) x -> URec Int p #

newtype Vector Int 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype Vector Int = V_Int (Vector Int)
data URec Int (p :: k)

Used for marking occurrences of Int#

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

data URec Int (p :: k) = UInt {}
newtype MVector s Int 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype MVector s Int = MV_Int (MVector s Int)
type Rep1 (URec Int :: k -> Type)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

type Rep1 (URec Int :: k -> Type) = D1 (MetaData "URec" "GHC.Generics" "base" False) (C1 (MetaCons "UInt" PrefixI True) (S1 (MetaSel (Just "uInt#") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (UInt :: k -> Type)))
type ToPretty Int

Render Int as PutStr Int

Since: pretty-types-0.2.1.0

Instance details

Defined in Data.Type.Pretty

type ToPretty Int = PutStr "Int"
type Rep (URec Int p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

type Rep (URec Int p) = D1 (MetaData "URec" "GHC.Generics" "base" False) (C1 (MetaCons "UInt" PrefixI True) (S1 (MetaSel (Just "uInt#") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (UInt :: Type -> Type)))

data Int8 #

8-bit signed integer type

Instances
Bounded Int8

Since: base-2.1

Instance details

Defined in GHC.Int

Enum Int8

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

succ :: Int8 -> Int8 #

pred :: Int8 -> Int8 #

toEnum :: Int -> Int8 #

fromEnum :: Int8 -> Int #

enumFrom :: Int8 -> [Int8] #

enumFromThen :: Int8 -> Int8 -> [Int8] #

enumFromTo :: Int8 -> Int8 -> [Int8] #

enumFromThenTo :: Int8 -> Int8 -> Int8 -> [Int8] #

Eq Int8

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

(==) :: Int8 -> Int8 -> Bool #

(/=) :: Int8 -> Int8 -> Bool #

Integral Int8

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

quot :: Int8 -> Int8 -> Int8 #

rem :: Int8 -> Int8 -> Int8 #

div :: Int8 -> Int8 -> Int8 #

mod :: Int8 -> Int8 -> Int8 #

quotRem :: Int8 -> Int8 -> (Int8, Int8) #

divMod :: Int8 -> Int8 -> (Int8, Int8) #

toInteger :: Int8 -> Integer #

Num Int8

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

(+) :: Int8 -> Int8 -> Int8 #

(-) :: Int8 -> Int8 -> Int8 #

(*) :: Int8 -> Int8 -> Int8 #

negate :: Int8 -> Int8 #

abs :: Int8 -> Int8 #

signum :: Int8 -> Int8 #

fromInteger :: Integer -> Int8 #

Ord Int8

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

compare :: Int8 -> Int8 -> Ordering #

(<) :: Int8 -> Int8 -> Bool #

(<=) :: Int8 -> Int8 -> Bool #

(>) :: Int8 -> Int8 -> Bool #

(>=) :: Int8 -> Int8 -> Bool #

max :: Int8 -> Int8 -> Int8 #

min :: Int8 -> Int8 -> Int8 #

Read Int8

Since: base-2.1

Instance details

Defined in GHC.Int

Real Int8

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

toRational :: Int8 -> Rational #

Show Int8

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

showsPrec :: Int -> Int8 -> ShowS #

show :: Int8 -> String #

showList :: [Int8] -> ShowS #

Ix Int8

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

range :: (Int8, Int8) -> [Int8] #

index :: (Int8, Int8) -> Int8 -> Int #

unsafeIndex :: (Int8, Int8) -> Int8 -> Int

inRange :: (Int8, Int8) -> Int8 -> Bool #

rangeSize :: (Int8, Int8) -> Int #

unsafeRangeSize :: (Int8, Int8) -> Int

Lift Int8 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

lift :: Int8 -> Q Exp #

PrintfArg Int8

Since: base-2.1

Instance details

Defined in Text.Printf

Storable Int8

Since: base-2.1

Instance details

Defined in Foreign.Storable

Methods

sizeOf :: Int8 -> Int #

alignment :: Int8 -> Int #

peekElemOff :: Ptr Int8 -> Int -> IO Int8 #

pokeElemOff :: Ptr Int8 -> Int -> Int8 -> IO () #

peekByteOff :: Ptr b -> Int -> IO Int8 #

pokeByteOff :: Ptr b -> Int -> Int8 -> IO () #

peek :: Ptr Int8 -> IO Int8 #

poke :: Ptr Int8 -> Int8 -> IO () #

Bits Int8

Since: base-2.1

Instance details

Defined in GHC.Int

FiniteBits Int8

Since: base-4.6.0.0

Instance details

Defined in GHC.Int

Default Int8 
Instance details

Defined in Data.Default.Class

Methods

def :: Int8 #

Prim Int8 
Instance details

Defined in Data.Primitive.Types

Unbox Int8 
Instance details

Defined in Data.Vector.Unboxed.Base

IsBoxContent Int8 Source # 
Instance details

Defined in Data.ByteString.IsoBaseFileFormat.Box

Vector Vector Int8 
Instance details

Defined in Data.Vector.Unboxed.Base

MVector MVector Int8 
Instance details

Defined in Data.Vector.Unboxed.Base

BitStringBuilderHoley (Proxy (MkField MkFieldI8)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

Associated Types

type ToBitStringBuilder (Proxy (MkField MkFieldI8)) a :: Type Source #

IsBoxContent (Scalar Int8 label) Source # 
Instance details

Defined in Data.ByteString.IsoBaseFileFormat.Util.BoxFields

newtype Vector Int8 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype MVector s Int8 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype MVector s Int8 = MV_Int8 (MVector s Int8)
type ToPretty Int8

Render Int8 as PutStr Int8

Since: pretty-types-0.2.1.0

Instance details

Defined in Data.Type.Pretty

type ToPretty Int8 = PutStr "Int8"
type ToBitStringBuilder (Proxy (MkField MkFieldI8)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

data Int16 #

16-bit signed integer type

Instances
Bounded Int16

Since: base-2.1

Instance details

Defined in GHC.Int

Enum Int16

Since: base-2.1

Instance details

Defined in GHC.Int

Eq Int16

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

(==) :: Int16 -> Int16 -> Bool #

(/=) :: Int16 -> Int16 -> Bool #

Integral Int16

Since: base-2.1

Instance details

Defined in GHC.Int

Num Int16

Since: base-2.1

Instance details

Defined in GHC.Int

Ord Int16

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

compare :: Int16 -> Int16 -> Ordering #

(<) :: Int16 -> Int16 -> Bool #

(<=) :: Int16 -> Int16 -> Bool #

(>) :: Int16 -> Int16 -> Bool #

(>=) :: Int16 -> Int16 -> Bool #

max :: Int16 -> Int16 -> Int16 #

min :: Int16 -> Int16 -> Int16 #

Read Int16

Since: base-2.1

Instance details

Defined in GHC.Int

Real Int16

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

toRational :: Int16 -> Rational #

Show Int16

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

showsPrec :: Int -> Int16 -> ShowS #

show :: Int16 -> String #

showList :: [Int16] -> ShowS #

Ix Int16

Since: base-2.1

Instance details

Defined in GHC.Int

Lift Int16 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

lift :: Int16 -> Q Exp #

PrintfArg Int16

Since: base-2.1

Instance details

Defined in Text.Printf

Storable Int16

Since: base-2.1

Instance details

Defined in Foreign.Storable

Methods

sizeOf :: Int16 -> Int #

alignment :: Int16 -> Int #

peekElemOff :: Ptr Int16 -> Int -> IO Int16 #

pokeElemOff :: Ptr Int16 -> Int -> Int16 -> IO () #

peekByteOff :: Ptr b -> Int -> IO Int16 #

pokeByteOff :: Ptr b -> Int -> Int16 -> IO () #

peek :: Ptr Int16 -> IO Int16 #

poke :: Ptr Int16 -> Int16 -> IO () #

Bits Int16

Since: base-2.1

Instance details

Defined in GHC.Int

FiniteBits Int16

Since: base-4.6.0.0

Instance details

Defined in GHC.Int

Default Int16 
Instance details

Defined in Data.Default.Class

Methods

def :: Int16 #

Prim Int16 
Instance details

Defined in Data.Primitive.Types

Unbox Int16 
Instance details

Defined in Data.Vector.Unboxed.Base

IsBoxContent Int16 Source # 
Instance details

Defined in Data.ByteString.IsoBaseFileFormat.Box

Vector Vector Int16 
Instance details

Defined in Data.Vector.Unboxed.Base

MVector MVector Int16 
Instance details

Defined in Data.Vector.Unboxed.Base

BitStringBuilderHoley (Proxy (MkField MkFieldI16)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

Associated Types

type ToBitStringBuilder (Proxy (MkField MkFieldI16)) a :: Type Source #

IsBoxContent (Scalar Int16 label) Source # 
Instance details

Defined in Data.ByteString.IsoBaseFileFormat.Util.BoxFields

newtype Vector Int16 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype MVector s Int16 
Instance details

Defined in Data.Vector.Unboxed.Base

type ToPretty Int16

Render Int16 as PutStr Int16

Since: pretty-types-0.2.1.0

Instance details

Defined in Data.Type.Pretty

type ToPretty Int16 = PutStr "Int16"
type ToBitStringBuilder (Proxy (MkField MkFieldI16)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

data Int32 #

32-bit signed integer type

Instances
Bounded Int32

Since: base-2.1

Instance details

Defined in GHC.Int

Enum Int32

Since: base-2.1

Instance details

Defined in GHC.Int

Eq Int32

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

(==) :: Int32 -> Int32 -> Bool #

(/=) :: Int32 -> Int32 -> Bool #

Integral Int32

Since: base-2.1

Instance details

Defined in GHC.Int

Num Int32

Since: base-2.1

Instance details

Defined in GHC.Int

Ord Int32

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

compare :: Int32 -> Int32 -> Ordering #

(<) :: Int32 -> Int32 -> Bool #

(<=) :: Int32 -> Int32 -> Bool #

(>) :: Int32 -> Int32 -> Bool #

(>=) :: Int32 -> Int32 -> Bool #

max :: Int32 -> Int32 -> Int32 #

min :: Int32 -> Int32 -> Int32 #

Read Int32

Since: base-2.1

Instance details

Defined in GHC.Int

Real Int32

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

toRational :: Int32 -> Rational #

Show Int32

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

showsPrec :: Int -> Int32 -> ShowS #

show :: Int32 -> String #

showList :: [Int32] -> ShowS #

Ix Int32

Since: base-2.1

Instance details

Defined in GHC.Int

Lift Int32 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

lift :: Int32 -> Q Exp #

PrintfArg Int32

Since: base-2.1

Instance details

Defined in Text.Printf

Storable Int32

Since: base-2.1

Instance details

Defined in Foreign.Storable

Methods

sizeOf :: Int32 -> Int #

alignment :: Int32 -> Int #

peekElemOff :: Ptr Int32 -> Int -> IO Int32 #

pokeElemOff :: Ptr Int32 -> Int -> Int32 -> IO () #

peekByteOff :: Ptr b -> Int -> IO Int32 #

pokeByteOff :: Ptr b -> Int -> Int32 -> IO () #

peek :: Ptr Int32 -> IO Int32 #

poke :: Ptr Int32 -> Int32 -> IO () #

Bits Int32

Since: base-2.1

Instance details

Defined in GHC.Int

FiniteBits Int32

Since: base-4.6.0.0

Instance details

Defined in GHC.Int

Default Int32 
Instance details

Defined in Data.Default.Class

Methods

def :: Int32 #

Prim Int32 
Instance details

Defined in Data.Primitive.Types

Unbox Int32 
Instance details

Defined in Data.Vector.Unboxed.Base

IsBoxContent Int32 Source # 
Instance details

Defined in Data.ByteString.IsoBaseFileFormat.Box

Vector Vector Int32 
Instance details

Defined in Data.Vector.Unboxed.Base

MVector MVector Int32 
Instance details

Defined in Data.Vector.Unboxed.Base

BitStringBuilderHoley (Proxy (MkField MkFieldI32)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

Associated Types

type ToBitStringBuilder (Proxy (MkField MkFieldI32)) a :: Type Source #

IsBoxContent (Scalar Int32 label) Source # 
Instance details

Defined in Data.ByteString.IsoBaseFileFormat.Util.BoxFields

newtype Vector Int32 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype MVector s Int32 
Instance details

Defined in Data.Vector.Unboxed.Base

type ToPretty Int32

Render Int32 as PutStr Int32

Since: pretty-types-0.2.1.0

Instance details

Defined in Data.Type.Pretty

type ToPretty Int32 = PutStr "Int32"
type ToBitStringBuilder (Proxy (MkField MkFieldI32)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

data Int64 #

64-bit signed integer type

Instances
Bounded Int64

Since: base-2.1

Instance details

Defined in GHC.Int

Enum Int64

Since: base-2.1

Instance details

Defined in GHC.Int

Eq Int64

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

(==) :: Int64 -> Int64 -> Bool #

(/=) :: Int64 -> Int64 -> Bool #

Integral Int64

Since: base-2.1

Instance details

Defined in GHC.Int

Num Int64

Since: base-2.1

Instance details

Defined in GHC.Int

Ord Int64

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

compare :: Int64 -> Int64 -> Ordering #

(<) :: Int64 -> Int64 -> Bool #

(<=) :: Int64 -> Int64 -> Bool #

(>) :: Int64 -> Int64 -> Bool #

(>=) :: Int64 -> Int64 -> Bool #

max :: Int64 -> Int64 -> Int64 #

min :: Int64 -> Int64 -> Int64 #

Read Int64

Since: base-2.1

Instance details

Defined in GHC.Int

Real Int64

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

toRational :: Int64 -> Rational #

Show Int64

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

showsPrec :: Int -> Int64 -> ShowS #

show :: Int64 -> String #

showList :: [Int64] -> ShowS #

Ix Int64

Since: base-2.1

Instance details

Defined in GHC.Int

Lift Int64 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

lift :: Int64 -> Q Exp #

PrintfArg Int64

Since: base-2.1

Instance details

Defined in Text.Printf

Storable Int64

Since: base-2.1

Instance details

Defined in Foreign.Storable

Methods

sizeOf :: Int64 -> Int #

alignment :: Int64 -> Int #

peekElemOff :: Ptr Int64 -> Int -> IO Int64 #

pokeElemOff :: Ptr Int64 -> Int -> Int64 -> IO () #

peekByteOff :: Ptr b -> Int -> IO Int64 #

pokeByteOff :: Ptr b -> Int -> Int64 -> IO () #

peek :: Ptr Int64 -> IO Int64 #

poke :: Ptr Int64 -> Int64 -> IO () #

Bits Int64

Since: base-2.1

Instance details

Defined in GHC.Int

FiniteBits Int64

Since: base-4.6.0.0

Instance details

Defined in GHC.Int

Default Int64 
Instance details

Defined in Data.Default.Class

Methods

def :: Int64 #

Prim Int64 
Instance details

Defined in Data.Primitive.Types

Unbox Int64 
Instance details

Defined in Data.Vector.Unboxed.Base

IsBoxContent Int64 Source # 
Instance details

Defined in Data.ByteString.IsoBaseFileFormat.Box

Vector Vector Int64 
Instance details

Defined in Data.Vector.Unboxed.Base

MVector MVector Int64 
Instance details

Defined in Data.Vector.Unboxed.Base

BitStringBuilderHoley (Proxy (MkField MkFieldI64)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

Associated Types

type ToBitStringBuilder (Proxy (MkField MkFieldI64)) a :: Type Source #

IsBoxContent (Scalar Int64 label) Source # 
Instance details

Defined in Data.ByteString.IsoBaseFileFormat.Util.BoxFields

newtype Vector Int64 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype MVector s Int64 
Instance details

Defined in Data.Vector.Unboxed.Base

type ToPretty Int64

Render Int64 as PutStr Int64

Since: pretty-types-0.2.1.0

Instance details

Defined in Data.Type.Pretty

type ToPretty Int64 = PutStr "Int64"
type ToBitStringBuilder (Proxy (MkField MkFieldI64)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

data Maybe a #

The Maybe type encapsulates an optional value. A value of type Maybe a either contains a value of type a (represented as Just a), or it is empty (represented as Nothing). Using Maybe is a good way to deal with errors or exceptional cases without resorting to drastic measures such as error.

The Maybe type is also a monad. It is a simple kind of error monad, where all errors are represented by Nothing. A richer error monad can be built using the Either type.

Constructors

Nothing 
Just a 
Instances
Monad Maybe

Since: base-2.1

Instance details

Defined in GHC.Base

Methods

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

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

return :: a -> Maybe a #

fail :: String -> Maybe a #

Functor Maybe

Since: base-2.1

Instance details

Defined in GHC.Base

Methods

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

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

Applicative Maybe

Since: base-2.1

Instance details

Defined in GHC.Base

Methods

pure :: a -> Maybe a #

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

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

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

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

Foldable Maybe

Since: base-2.1

Instance details

Defined in Data.Foldable

Methods

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

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

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

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

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

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

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

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

toList :: Maybe a -> [a] #

null :: Maybe a -> Bool #

length :: Maybe a -> Int #

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

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

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

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

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

Traversable Maybe

Since: base-2.1

Instance details

Defined in Data.Traversable

Methods

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

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

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

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

Eq1 Maybe

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

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

Ord1 Maybe

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

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

Read1 Maybe

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

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

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

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

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

Show1 Maybe

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

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

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

Alternative Maybe

Since: base-2.1

Instance details

Defined in GHC.Base

Methods

empty :: Maybe a #

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

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

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

MonadPlus Maybe

Since: base-2.1

Instance details

Defined in GHC.Base

Methods

mzero :: Maybe a #

mplus :: Maybe a -> Maybe a -> Maybe a #

PTraversable Maybe 
Instance details

Defined in Data.Singletons.Prelude.Traversable

Associated Types

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

type SequenceA arg :: f (t a) #

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

type Sequence arg :: m (t a) #

STraversable Maybe 
Instance details

Defined in Data.Singletons.Prelude.Traversable

Methods

sTraverse :: SApplicative f => Sing t1 -> Sing t2 -> Sing (Apply (Apply TraverseSym0 t1) t2) #

sSequenceA :: SApplicative f => Sing t1 -> Sing (Apply SequenceASym0 t1) #

sMapM :: SMonad m => Sing t1 -> Sing t2 -> Sing (Apply (Apply MapMSym0 t1) t2) #

sSequence :: SMonad m => Sing t1 -> Sing (Apply SequenceSym0 t1) #

PFoldable Maybe 
Instance details

Defined in Data.Singletons.Prelude.Foldable

Associated Types

type Fold arg :: m #

type FoldMap arg arg1 :: m #

type Foldr arg arg1 arg2 :: b #

type Foldr' arg arg1 arg2 :: b #

type Foldl arg arg1 arg2 :: b #

type Foldl' arg arg1 arg2 :: b #

type Foldr1 arg arg1 :: a #

type Foldl1 arg arg1 :: a #

type ToList arg :: [a] #

type Null arg :: Bool #

type Length arg :: Nat #

type Elem arg arg1 :: Bool #

type Maximum arg :: a #

type Minimum arg :: a #

type Sum arg :: a #

type Product arg :: a #

SFoldable Maybe 
Instance details

Defined in Data.Singletons.Prelude.Foldable

Methods

sFold :: SMonoid m => Sing t1 -> Sing (Apply FoldSym0 t1) #

sFoldMap :: SMonoid m => Sing t1 -> Sing t2 -> Sing (Apply (Apply FoldMapSym0 t1) t2) #

sFoldr :: Sing t1 -> Sing t2 -> Sing t3 -> Sing (Apply (Apply (Apply FoldrSym0 t1) t2) t3) #

sFoldr' :: Sing t1 -> Sing t2 -> Sing t3 -> Sing (Apply (Apply (Apply Foldr'Sym0 t1) t2) t3) #

sFoldl :: Sing t1 -> Sing t2 -> Sing t3 -> Sing (Apply (Apply (Apply FoldlSym0 t1) t2) t3) #

sFoldl' :: Sing t1 -> Sing t2 -> Sing t3 -> Sing (Apply (Apply (Apply Foldl'Sym0 t1) t2) t3) #

sFoldr1 :: Sing t1 -> Sing t2 -> Sing (Apply (Apply Foldr1Sym0 t1) t2) #

sFoldl1 :: Sing t1 -> Sing t2 -> Sing (Apply (Apply Foldl1Sym0 t1) t2) #

sToList :: Sing t1 -> Sing (Apply ToListSym0 t1) #

sNull :: Sing t1 -> Sing (Apply NullSym0 t1) #

sLength :: Sing t1 -> Sing (Apply LengthSym0 t1) #

sElem :: SEq a => Sing t1 -> Sing t2 -> Sing (Apply (Apply ElemSym0 t1) t2) #

sMaximum :: SOrd a => Sing t1 -> Sing (Apply MaximumSym0 t1) #

sMinimum :: SOrd a => Sing t1 -> Sing (Apply MinimumSym0 t1) #

sSum :: SNum a => Sing t1 -> Sing (Apply SumSym0 t1) #

sProduct :: SNum a => Sing t1 -> Sing (Apply ProductSym0 t1) #

PFunctor Maybe 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

Associated Types

type Fmap arg arg1 :: f b #

type arg <$ arg1 :: f a #

PApplicative Maybe 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

Associated Types

type Pure arg :: f a #

type arg <*> arg1 :: f b #

type LiftA2 arg arg1 arg2 :: f c #

type arg *> arg1 :: f b #

type arg <* arg1 :: f a #

PMonad Maybe 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

Associated Types

type arg >>= arg1 :: m b #

type arg >> arg1 :: m b #

type Return arg :: m a #

type Fail arg :: m a #

PAlternative Maybe 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

Associated Types

type Empty :: f a #

type arg <|> arg1 :: f a #

PMonadPlus Maybe 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

Associated Types

type Mzero :: m a #

type Mplus arg arg1 :: m a #

SFunctor Maybe 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

Methods

sFmap :: Sing t1 -> Sing t2 -> Sing (Apply (Apply FmapSym0 t1) t2) #

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

SApplicative Maybe 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

Methods

sPure :: Sing t -> Sing (Apply PureSym0 t) #

(%<*>) :: Sing t1 -> Sing t2 -> Sing (Apply (Apply (<*>@#@$) t1) t2) #

sLiftA2 :: Sing t1 -> Sing t2 -> Sing t3 -> Sing (Apply (Apply (Apply LiftA2Sym0 t1) t2) t3) #

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

(%<*) :: Sing t1 -> Sing t2 -> Sing (Apply (Apply (<*@#@$) t1) t2) #

SMonad Maybe 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

Methods

(%>>=) :: Sing t1 -> Sing t2 -> Sing (Apply (Apply (>>=@#@$) t1) t2) #

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

sReturn :: Sing t -> Sing (Apply ReturnSym0 t) #

sFail :: Sing t -> Sing (Apply FailSym0 t) #

SAlternative Maybe 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

Methods

sEmpty :: Sing EmptySym0 #

(%<|>) :: Sing t1 -> Sing t2 -> Sing (Apply (Apply (<|>@#@$) t1) t2) #

SMonadPlus Maybe 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

Methods

sMzero :: Sing MzeroSym0 #

sMplus :: Sing t1 -> Sing t2 -> Sing (Apply (Apply MplusSym0 t1) t2) #

Eq a => Eq (Maybe a)

Since: base-2.1

Instance details

Defined in GHC.Maybe

Methods

(==) :: Maybe a -> Maybe a -> Bool #

(/=) :: Maybe a -> Maybe a -> Bool #

Ord a => Ord (Maybe a)

Since: base-2.1

Instance details

Defined in GHC.Maybe

Methods

compare :: Maybe a -> Maybe a -> Ordering #

(<) :: Maybe a -> Maybe a -> Bool #

(<=) :: Maybe a -> Maybe a -> Bool #

(>) :: Maybe a -> Maybe a -> Bool #

(>=) :: Maybe a -> Maybe a -> Bool #

max :: Maybe a -> Maybe a -> Maybe a #

min :: Maybe a -> Maybe a -> Maybe a #

Read a => Read (Maybe a)

Since: base-2.1

Instance details

Defined in GHC.Read

Show a => Show (Maybe a)

Since: base-2.1

Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> Maybe a -> ShowS #

show :: Maybe a -> String #

showList :: [Maybe a] -> ShowS #

Generic (Maybe a) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (Maybe a) :: Type -> Type #

Methods

from :: Maybe a -> Rep (Maybe a) x #

to :: Rep (Maybe a) x -> Maybe a #

Semigroup a => Semigroup (Maybe a)

Since: base-4.9.0.0

Instance details

Defined in GHC.Base

Methods

(<>) :: Maybe a -> Maybe a -> Maybe a #

sconcat :: NonEmpty (Maybe a) -> Maybe a #

stimes :: Integral b => b -> Maybe a -> Maybe a #

Semigroup a => Monoid (Maybe a)

Lift a semigroup into Maybe forming a Monoid according to http://en.wikipedia.org/wiki/Monoid: "Any semigroup S may be turned into a monoid simply by adjoining an element e not in S and defining e*e = e and e*s = s = s*e for all s ∈ S."

Since 4.11.0: constraint on inner a value generalised from Monoid to Semigroup.

Since: base-2.1

Instance details

Defined in GHC.Base

Methods

mempty :: Maybe a #

mappend :: Maybe a -> Maybe a -> Maybe a #

mconcat :: [Maybe a] -> Maybe a #

Lift a => Lift (Maybe a) 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

lift :: Maybe a -> Q Exp #

SingKind a => SingKind (Maybe a)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Associated Types

type DemoteRep (Maybe a) :: Type

Methods

fromSing :: Sing a0 -> DemoteRep (Maybe a)

Default (Maybe a) 
Instance details

Defined in Data.Default.Class

Methods

def :: Maybe a #

PMonoid (Maybe a) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

Associated Types

type Mempty :: a #

type Mappend arg arg1 :: a #

type Mconcat arg :: a #

SSemigroup a => SMonoid (Maybe a) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

PShow (Maybe a) 
Instance details

Defined in Data.Singletons.Prelude.Show

Associated Types

type ShowsPrec arg arg1 arg2 :: Symbol #

type Show_ arg :: Symbol #

type ShowList arg arg1 :: Symbol #

SShow a => SShow (Maybe a) 
Instance details

Defined in Data.Singletons.Prelude.Show

Methods

sShowsPrec :: Sing t1 -> Sing t2 -> Sing t3 -> Sing (Apply (Apply (Apply ShowsPrecSym0 t1) t2) t3) #

sShow_ :: Sing t -> Sing (Apply Show_Sym0 t) #

sShowList :: Sing t1 -> Sing t2 -> Sing (Apply (Apply ShowListSym0 t1) t2) #

PSemigroup (Maybe a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

Associated Types

type arg <> arg1 :: a #

type Sconcat arg :: a #

SSemigroup a => SSemigroup (Maybe a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

Methods

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

sSconcat :: Sing t -> Sing (Apply SconcatSym0 t) #

POrd (Maybe a) 
Instance details

Defined in Data.Singletons.Prelude.Ord

Associated Types

type Compare arg arg1 :: Ordering #

type arg < arg1 :: Bool #

type arg <= arg1 :: Bool #

type arg > arg1 :: Bool #

type arg >= arg1 :: Bool #

type Max arg arg1 :: a #

type Min arg arg1 :: a #

SOrd a => SOrd (Maybe a) 
Instance details

Defined in Data.Singletons.Prelude.Ord

Methods

sCompare :: Sing t1 -> Sing t2 -> Sing (Apply (Apply CompareSym0 t1) t2) #

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

(%<=) :: Sing t1 -> Sing t2 -> Sing (Apply (Apply (<=@#@$) t1) t2) #

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

(%>=) :: Sing t1 -> Sing t2 -> Sing (Apply (Apply (>=@#@$) t1) t2) #

sMax :: Sing t1 -> Sing t2 -> Sing (Apply (Apply MaxSym0 t1) t2) #

sMin :: Sing t1 -> Sing t2 -> Sing (Apply (Apply MinSym0 t1) t2) #

SEq a => SEq (Maybe a) 
Instance details

Defined in Data.Singletons.Prelude.Eq

Methods

(%==) :: Sing a0 -> Sing b -> Sing (a0 == b) #

(%/=) :: Sing a0 -> Sing b -> Sing (a0 /= b) #

PEq (Maybe a) 
Instance details

Defined in Data.Singletons.Prelude.Eq

Associated Types

type x == y :: Bool #

type x /= y :: Bool #

IsBoxContent a => IsBoxContent (Maybe a) Source #

This instance writes zero bytes for Nothing and delegates on Just.

Instance details

Defined in Data.ByteString.IsoBaseFileFormat.Box

Generic1 Maybe 
Instance details

Defined in GHC.Generics

Associated Types

type Rep1 Maybe :: k -> Type #

Methods

from1 :: Maybe a -> Rep1 Maybe a #

to1 :: Rep1 Maybe a -> Maybe a #

SingI (Nothing :: Maybe a)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

sing :: Sing Nothing

SingI a2 => SingI (Just a2 :: Maybe a1)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

sing :: Sing (Just a2)

SuppressUnusedWarnings (CatMaybesSym0 :: TyFun [Maybe a6989586621679494730] [a6989586621679494730] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Maybe

SuppressUnusedWarnings (ListToMaybeSym0 :: TyFun [a6989586621679494731] (Maybe a6989586621679494731) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Maybe

SuppressUnusedWarnings (StripPrefixSym0 :: TyFun [a6989586621680065507] ([a6989586621680065507] ~> Maybe [a6989586621680065507]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (TFHelper_6989586621679607718Sym0 :: TyFun (Maybe a6989586621679544343) (Maybe a6989586621679544343 ~> Maybe a6989586621679544343) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

SuppressUnusedWarnings (MaybeToListSym0 :: TyFun (Maybe a6989586621679494732) [a6989586621679494732] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Maybe

SuppressUnusedWarnings (IsNothingSym0 :: TyFun (Maybe a6989586621679494735) Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Maybe

SuppressUnusedWarnings (IsJustSym0 :: TyFun (Maybe a6989586621679494736) Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Maybe

SuppressUnusedWarnings (FromJustSym0 :: TyFun (Maybe a6989586621679494734) a6989586621679494734 -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Maybe

SuppressUnusedWarnings (MinInternalSym0 :: TyFun (Maybe a6989586621680441338) (MinInternal a6989586621680441338) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (MaxInternalSym0 :: TyFun (Maybe a6989586621680440659) (MaxInternal a6989586621680440659) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (Compare_6989586621679390452Sym0 :: TyFun (Maybe a3530822107858468865) (Maybe a3530822107858468865 ~> Ordering) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

SuppressUnusedWarnings (OptionSym0 :: TyFun (Maybe a6989586621679050999) (Option a6989586621679050999) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (LastSym0 :: TyFun (Maybe a6989586621679072619) (Last a6989586621679072619) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

SuppressUnusedWarnings (FirstSym0 :: TyFun (Maybe a6989586621679072624) (First a6989586621679072624) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

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

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (Fail_6989586621679607625Sym0 :: TyFun Symbol (Maybe a6989586621679544294) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

SuppressUnusedWarnings (Pure_6989586621679607418Sym0 :: TyFun a6989586621679544265 (Maybe a6989586621679544265) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

SuppressUnusedWarnings (Let6989586621679607714LSym0 :: TyFun k1 (Maybe k1) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

SuppressUnusedWarnings (FromMaybeSym0 :: TyFun a6989586621679494733 (Maybe a6989586621679494733 ~> a6989586621679494733) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Maybe

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

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (JustSym0 :: TyFun a3530822107858468865 (Maybe a3530822107858468865) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Instances

SuppressUnusedWarnings (GetOptionSym0 :: TyFun (Option a6989586621679050999) (Maybe a6989586621679050999) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (GetFirstSym0 :: TyFun (First a6989586621679072624) (Maybe a6989586621679072624) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

SuppressUnusedWarnings (GetLastSym0 :: TyFun (Last a6989586621679072619) (Maybe a6989586621679072619) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

SuppressUnusedWarnings (FindSym0 :: TyFun (a6989586621679939292 ~> Bool) ([a6989586621679939292] ~> Maybe a6989586621679939292) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

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

Defined in Data.Singletons.Prelude.List.Internal

SingI (CatMaybesSym0 :: TyFun [Maybe a] [a] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Maybe

SingI (ListToMaybeSym0 :: TyFun [a] (Maybe a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Maybe

SingI (MaybeToListSym0 :: TyFun (Maybe a) [a] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Maybe

SingI (IsNothingSym0 :: TyFun (Maybe a) Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Maybe

SingI (IsJustSym0 :: TyFun (Maybe a) Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Maybe

Methods

sing :: Sing IsJustSym0 #

SingI (FromJustSym0 :: TyFun (Maybe a) a -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Maybe

SingI (OptionSym0 :: TyFun (Maybe a) (Option a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

Methods

sing :: Sing OptionSym0 #

SingI (LastSym0 :: TyFun (Maybe a) (Last a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

Methods

sing :: Sing LastSym0 #

SingI (FirstSym0 :: TyFun (Maybe a) (First a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

Methods

sing :: Sing FirstSym0 #

SingI (FromMaybeSym0 :: TyFun a (Maybe a ~> a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Maybe

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

Defined in Data.Singletons.Prelude.List.Internal

SingI (JustSym0 :: TyFun a (Maybe a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Instances

Methods

sing :: Sing JustSym0 #

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

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing FindSym0 #

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

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (StripPrefixSym1 a6989586621680078217 :: TyFun [a6989586621680065507] (Maybe [a6989586621680065507]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (FindSym1 a6989586621679948849 :: TyFun [a6989586621679939292] (Maybe a6989586621679939292) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (FindIndexSym1 a6989586621679949209 :: TyFun [a6989586621679939289] (Maybe Nat) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (ElemIndexSym1 a6989586621679949217 :: TyFun [a6989586621679939291] (Maybe Nat) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (ShowsPrec_6989586621680280443Sym1 a6989586621680280440 a3530822107858468865 :: TyFun (Maybe a3530822107858468865) (Symbol ~> Symbol) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (TFHelper_6989586621679607718Sym1 a6989586621679607716 :: TyFun (Maybe a6989586621679544343) (Maybe a6989586621679544343) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

SuppressUnusedWarnings (TFHelper_6989586621679607618Sym0 :: TyFun (Maybe a6989586621679544291) (Maybe b6989586621679544292 ~> Maybe b6989586621679544292) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

SuppressUnusedWarnings (TFHelper_6989586621679607602Sym0 :: TyFun (Maybe a6989586621679544289) ((a6989586621679544289 ~> Maybe b6989586621679544290) ~> Maybe b6989586621679544290) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

SuppressUnusedWarnings (TFHelper_6989586621679607460Sym0 :: TyFun (Maybe a6989586621679544271) (Maybe b6989586621679544272 ~> Maybe b6989586621679544272) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

SuppressUnusedWarnings (FromMaybeSym1 a6989586621679494925 :: TyFun (Maybe a6989586621679494733) a6989586621679494733 -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Maybe

SuppressUnusedWarnings (Compare_6989586621679390452Sym1 a6989586621679390450 :: TyFun (Maybe a3530822107858468865) Ordering -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

SuppressUnusedWarnings (TFHelper_6989586621679607430Sym0 :: TyFun (Maybe (a6989586621679544266 ~> b6989586621679544267)) (Maybe a6989586621679544266 ~> Maybe b6989586621679544267) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

SuppressUnusedWarnings (TFHelper_6989586621679607289Sym0 :: TyFun a6989586621679544262 (Maybe b6989586621679544263 ~> Maybe a6989586621679544262) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

SuppressUnusedWarnings (Maybe_Sym0 :: TyFun b6989586621679493306 ((a6989586621679493307 ~> b6989586621679493306) ~> (Maybe a6989586621679493307 ~> b6989586621679493306)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Maybe

SuppressUnusedWarnings (LookupSym0 :: TyFun a6989586621679939270 ([(a6989586621679939270, b6989586621679939271)] ~> Maybe b6989586621679939271) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (Let6989586621680442136NSym0 :: TyFun k (TyFun k1 (Maybe k1) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (Let6989586621680442136MSym0 :: TyFun k1 (TyFun k (Maybe k1) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (Let6989586621680442109NSym0 :: TyFun k (TyFun k1 (Maybe k1) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (Let6989586621680442109MSym0 :: TyFun k1 (TyFun k (Maybe k1) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (Fmap_6989586621679607269Sym0 :: TyFun (a6989586621679544260 ~> b6989586621679544261) (Maybe a6989586621679544260 ~> Maybe b6989586621679544261) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

SuppressUnusedWarnings (MapMaybeSym0 :: TyFun (a6989586621679494728 ~> Maybe b6989586621679494729) ([a6989586621679494728] ~> [b6989586621679494729]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Maybe

SuppressUnusedWarnings (UnfoldrSym0 :: TyFun (b6989586621679939348 ~> Maybe (a6989586621679939349, b6989586621679939348)) (b6989586621679939348 ~> [a6989586621679939349]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (FindSym0 :: TyFun (a6989586621680450227 ~> Bool) (t6989586621680450226 a6989586621680450227 ~> Maybe a6989586621680450227) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

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

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing (FindSym1 d) #

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

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing (FindIndexSym1 d) #

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

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing (ElemIndexSym1 d) #

SingI d => SingI (FromMaybeSym1 d :: TyFun (Maybe a) a -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Maybe

Methods

sing :: Sing (FromMaybeSym1 d) #

SingI (Maybe_Sym0 :: TyFun b ((a ~> b) ~> (Maybe a ~> b)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Maybe

Methods

sing :: Sing Maybe_Sym0 #

SEq a => SingI (LookupSym0 :: TyFun a ([(a, b)] ~> Maybe b) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing LookupSym0 #

SingI (MapMaybeSym0 :: TyFun (a ~> Maybe b) ([a] ~> [b]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Maybe

SingI (UnfoldrSym0 :: TyFun (b ~> Maybe (a, b)) (b ~> [a]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SFoldable t => SingI (FindSym0 :: TyFun (a ~> Bool) (t a ~> Maybe a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

Methods

sing :: Sing FindSym0 #

SuppressUnusedWarnings (LookupSym1 a6989586621679948631 b6989586621679939271 :: TyFun [(a6989586621679939270, b6989586621679939271)] (Maybe b6989586621679939271) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (TFHelper_6989586621679607618Sym1 a6989586621679607616 b6989586621679544292 :: TyFun (Maybe b6989586621679544292) (Maybe b6989586621679544292) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

SuppressUnusedWarnings (TFHelper_6989586621679607460Sym1 a6989586621679607458 b6989586621679544272 :: TyFun (Maybe b6989586621679544272) (Maybe b6989586621679544272) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

SuppressUnusedWarnings (TFHelper_6989586621679607430Sym1 a6989586621679607428 :: TyFun (Maybe a6989586621679544266) (Maybe b6989586621679544267) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

SuppressUnusedWarnings (TFHelper_6989586621679607289Sym1 a6989586621679607287 b6989586621679544263 :: TyFun (Maybe b6989586621679544263) (Maybe a6989586621679544262) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

SuppressUnusedWarnings (Fmap_6989586621679607269Sym1 a6989586621679607267 :: TyFun (Maybe a6989586621679544260) (Maybe b6989586621679544261) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

SuppressUnusedWarnings (Let6989586621680442136NSym1 x6989586621680442134 :: TyFun k1 (Maybe k1) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (Let6989586621680442136MSym1 x6989586621680442134 :: TyFun k (Maybe k1) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (Let6989586621680442109NSym1 x6989586621680442107 :: TyFun k1 (Maybe k1) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (Let6989586621680442109MSym1 x6989586621680442107 :: TyFun k (Maybe k1) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (FindSym1 a6989586621680450684 t6989586621680450226 :: TyFun (t6989586621680450226 a6989586621680450227) (Maybe a6989586621680450227) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (Lambda_6989586621680338490Sym0 :: TyFun k (TyFun (k1 ~> Last a) (TyFun k1 (Maybe a) -> Type) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

SuppressUnusedWarnings (Lambda_6989586621680338402Sym0 :: TyFun k (TyFun (k1 ~> First a) (TyFun k1 (Maybe a) -> Type) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

SuppressUnusedWarnings (Traverse_6989586621680753993Sym0 :: TyFun (a6989586621680747832 ~> f6989586621680747831 b6989586621680747833) (Maybe a6989586621680747832 ~> f6989586621680747831 (Maybe b6989586621680747833)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

SuppressUnusedWarnings (TFHelper_6989586621679607602Sym1 a6989586621679607600 b6989586621679544290 :: TyFun (a6989586621679544289 ~> Maybe b6989586621679544290) (Maybe b6989586621679544290) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

SuppressUnusedWarnings (LiftA2_6989586621679607446Sym0 :: TyFun (a6989586621679544268 ~> (b6989586621679544269 ~> c6989586621679544270)) (Maybe a6989586621679544268 ~> (Maybe b6989586621679544269 ~> Maybe c6989586621679544270)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

SuppressUnusedWarnings (Maybe_Sym1 a6989586621679493324 a6989586621679493307 :: TyFun (a6989586621679493307 ~> b6989586621679493306) (Maybe a6989586621679493307 ~> b6989586621679493306) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Maybe

SuppressUnusedWarnings (Let6989586621679494902RsSym0 :: TyFun (a6989586621679494728 ~> Maybe k1) (TyFun k (TyFun [a6989586621679494728] [k1] -> Type) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Maybe

SuppressUnusedWarnings (Let6989586621680451161MfSym0 :: TyFun (k2 ~> (k3 ~> k3)) (TyFun k (TyFun (Maybe k2) (TyFun k3 (Maybe k3) -> Type) -> Type) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (Let6989586621680451136MfSym0 :: TyFun (k3 ~> (k2 ~> k3)) (TyFun k (TyFun k3 (TyFun (Maybe k2) (Maybe k3) -> Type) -> Type) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

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

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing (LookupSym1 d b) #

(SFoldable t, SingI d) => SingI (FindSym1 d t :: TyFun (t a) (Maybe a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

Methods

sing :: Sing (FindSym1 d t) #

SingI d => SingI (Maybe_Sym1 d a :: TyFun (a ~> b) (Maybe a ~> b) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Maybe

Methods

sing :: Sing (Maybe_Sym1 d a) #

SuppressUnusedWarnings (Traverse_6989586621680753993Sym1 a6989586621680753991 :: TyFun (Maybe a6989586621680747832) (f6989586621680747831 (Maybe b6989586621680747833)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

SuppressUnusedWarnings (LiftA2_6989586621679607446Sym1 a6989586621679607443 :: TyFun (Maybe a6989586621679544268) (Maybe b6989586621679544269 ~> Maybe c6989586621679544270) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

SuppressUnusedWarnings (Maybe_Sym2 a6989586621679493325 a6989586621679493324 :: TyFun (Maybe a6989586621679493307) b6989586621679493306 -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Maybe

SuppressUnusedWarnings (Let6989586621680451161MfSym1 f6989586621680451159 :: TyFun k (TyFun (Maybe k2) (TyFun k3 (Maybe k3) -> Type) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (Let6989586621680451136MfSym1 f6989586621680451134 :: TyFun k (TyFun k3 (TyFun (Maybe k2) (Maybe k3) -> Type) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (Lambda_6989586621680338490Sym1 a6989586621680338488 :: TyFun (k1 ~> Last a) (TyFun k1 (Maybe a) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

SuppressUnusedWarnings (Lambda_6989586621680338402Sym1 a6989586621680338400 :: TyFun (k1 ~> First a) (TyFun k1 (Maybe a) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

(SingI d1, SingI d2) => SingI (Maybe_Sym2 d1 d2 :: TyFun (Maybe a) b -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Maybe

Methods

sing :: Sing (Maybe_Sym2 d1 d2) #

SuppressUnusedWarnings (LiftA2_6989586621679607446Sym2 a6989586621679607444 a6989586621679607443 :: TyFun (Maybe b6989586621679544269) (Maybe c6989586621679544270) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

SuppressUnusedWarnings (Let6989586621680451161MfSym2 xs6989586621680451160 f6989586621680451159 :: TyFun (Maybe k2) (TyFun k3 (Maybe k3) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (Let6989586621680451136MfSym2 xs6989586621680451135 f6989586621680451134 :: TyFun k3 (TyFun (Maybe k2) (Maybe k3) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (Lambda_6989586621680338490Sym2 k6989586621680338489 a6989586621680338488 :: TyFun k1 (Maybe a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

SuppressUnusedWarnings (Lambda_6989586621680338402Sym2 k6989586621680338401 a6989586621680338400 :: TyFun k1 (Maybe a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

SuppressUnusedWarnings (Let6989586621680451136MfSym3 a6989586621680451137 xs6989586621680451135 f6989586621680451134 :: TyFun (Maybe k2) (Maybe k3) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (Let6989586621680451161MfSym3 a6989586621680451162 xs6989586621680451160 f6989586621680451159 :: TyFun k3 (Maybe k3) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Empty 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type Empty = (Empty_6989586621679607706Sym0 :: Maybe a)
type Mzero 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type Mzero = (Mzero_6989586621679544818Sym0 :: Maybe a)
type Product (arg :: Maybe a) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Product (arg :: Maybe a) = Apply (Product_6989586621680451297Sym0 :: TyFun (Maybe a) a -> Type) arg
type Sum (arg :: Maybe a) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Sum (arg :: Maybe a) = Apply (Sum_6989586621680451284Sym0 :: TyFun (Maybe a) a -> Type) arg
type Minimum (arg :: Maybe a) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

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

Defined in Data.Singletons.Prelude.Foldable

type Maximum (arg :: Maybe a) = Apply (Maximum_6989586621680451258Sym0 :: TyFun (Maybe a) a -> Type) arg
type Length (arg :: Maybe a) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Length (arg :: Maybe a) = Apply (Length_6989586621680451229Sym0 :: TyFun (Maybe a) Nat -> Type) arg
type Null (arg :: Maybe a) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Null (arg :: Maybe a) = Apply (Null_6989586621680451207Sym0 :: TyFun (Maybe a) Bool -> Type) arg
type ToList (arg :: Maybe a) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type ToList (arg :: Maybe a) = Apply (ToList_6989586621680451186Sym0 :: TyFun (Maybe a) [a] -> Type) arg
type Fold (arg :: Maybe m) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Fold (arg :: Maybe m) = Apply (Fold_6989586621680451003Sym0 :: TyFun (Maybe m) m -> Type) arg
type Pure (a :: k1) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type Pure (a :: k1) = Apply (Pure_6989586621679607418Sym0 :: TyFun k1 (Maybe k1) -> Type) a
type Fail a2 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type Fail a2 = Apply (Fail_6989586621679607625Sym0 :: TyFun Symbol (Maybe a1) -> Type) a2
type Return (arg :: a) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type Return (arg :: a) = Apply (Return_6989586621679544800Sym0 :: TyFun a (Maybe a) -> Type) arg
type Sequence (arg :: Maybe (m a)) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type Sequence (arg :: Maybe (m a)) = Apply (Sequence_6989586621680747899Sym0 :: TyFun (Maybe (m a)) (m (Maybe a)) -> Type) arg
type SequenceA (arg :: Maybe (f a)) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type SequenceA (arg :: Maybe (f a)) = Apply (SequenceA_6989586621680747874Sym0 :: TyFun (Maybe (f a)) (f (Maybe a)) -> Type) arg
type Elem (arg1 :: a) (arg2 :: Maybe a) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Elem (arg1 :: a) (arg2 :: Maybe a) = Apply (Apply (Elem_6989586621680451244Sym0 :: TyFun a (Maybe a ~> Bool) -> Type) arg1) arg2
type Foldl1 (arg1 :: a ~> (a ~> a)) (arg2 :: Maybe a) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Foldl1 (arg1 :: a ~> (a ~> a)) (arg2 :: Maybe a) = Apply (Apply (Foldl1_6989586621680451176Sym0 :: TyFun (a ~> (a ~> a)) (Maybe a ~> a) -> Type) arg1) arg2
type Foldr1 (arg1 :: a ~> (a ~> a)) (arg2 :: Maybe a) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Foldr1 (arg1 :: a ~> (a ~> a)) (arg2 :: Maybe a) = Apply (Apply (Foldr1_6989586621680451151Sym0 :: TyFun (a ~> (a ~> a)) (Maybe a ~> a) -> Type) arg1) arg2
type (a1 :: Maybe a6989586621679544343) <|> (a2 :: Maybe a6989586621679544343) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type (a1 :: Maybe a6989586621679544343) <|> (a2 :: Maybe a6989586621679544343) = Apply (Apply (TFHelper_6989586621679607718Sym0 :: TyFun (Maybe a6989586621679544343) (Maybe a6989586621679544343 ~> Maybe a6989586621679544343) -> Type) a1) a2
type Mplus (arg1 :: Maybe a) (arg2 :: Maybe a) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type Mplus (arg1 :: Maybe a) (arg2 :: Maybe a) = Apply (Apply (Mplus_6989586621679544832Sym0 :: TyFun (Maybe a) (Maybe a ~> Maybe a) -> Type) arg1) arg2
type FoldMap (a1 :: a6989586621680450321 ~> k2) (a2 :: Maybe a6989586621680450321) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type FoldMap (a1 :: a6989586621680450321 ~> k2) (a2 :: Maybe a6989586621680450321) = Apply (Apply (FoldMap_6989586621680451315Sym0 :: TyFun (a6989586621680450321 ~> k2) (Maybe a6989586621680450321 ~> k2) -> Type) a1) a2
type (a1 :: k1) <$ (a2 :: Maybe b6989586621679544263) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type (a1 :: k1) <$ (a2 :: Maybe b6989586621679544263) = Apply (Apply (TFHelper_6989586621679607289Sym0 :: TyFun k1 (Maybe b6989586621679544263 ~> Maybe k1) -> Type) a1) a2
type Fmap (a1 :: a6989586621679544260 ~> b6989586621679544261) (a2 :: Maybe a6989586621679544260) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type Fmap (a1 :: a6989586621679544260 ~> b6989586621679544261) (a2 :: Maybe a6989586621679544260) = Apply (Apply (Fmap_6989586621679607269Sym0 :: TyFun (a6989586621679544260 ~> b6989586621679544261) (Maybe a6989586621679544260 ~> Maybe b6989586621679544261) -> Type) a1) a2
type (arg1 :: Maybe a) <* (arg2 :: Maybe b) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type (arg1 :: Maybe a) <* (arg2 :: Maybe b) = Apply (Apply (TFHelper_6989586621679544756Sym0 :: TyFun (Maybe a) (Maybe b ~> Maybe a) -> Type) arg1) arg2
type (a1 :: Maybe a6989586621679544271) *> (a2 :: Maybe b6989586621679544272) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type (a1 :: Maybe a6989586621679544271) *> (a2 :: Maybe b6989586621679544272) = Apply (Apply (TFHelper_6989586621679607460Sym0 :: TyFun (Maybe a6989586621679544271) (Maybe b6989586621679544272 ~> Maybe b6989586621679544272) -> Type) a1) a2
type (a1 :: Maybe (a6989586621679544266 ~> b6989586621679544267)) <*> (a2 :: Maybe a6989586621679544266) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type (a1 :: Maybe (a6989586621679544266 ~> b6989586621679544267)) <*> (a2 :: Maybe a6989586621679544266) = Apply (Apply (TFHelper_6989586621679607430Sym0 :: TyFun (Maybe (a6989586621679544266 ~> b6989586621679544267)) (Maybe a6989586621679544266 ~> Maybe b6989586621679544267) -> Type) a1) a2
type (a1 :: Maybe a6989586621679544291) >> (a2 :: Maybe b6989586621679544292) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type (a1 :: Maybe a6989586621679544291) >> (a2 :: Maybe b6989586621679544292) = Apply (Apply (TFHelper_6989586621679607618Sym0 :: TyFun (Maybe a6989586621679544291) (Maybe b6989586621679544292 ~> Maybe b6989586621679544292) -> Type) a1) a2
type (a1 :: Maybe a6989586621679544289) >>= (a2 :: a6989586621679544289 ~> Maybe b6989586621679544290) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type (a1 :: Maybe a6989586621679544289) >>= (a2 :: a6989586621679544289 ~> Maybe b6989586621679544290) = Apply (Apply (TFHelper_6989586621679607602Sym0 :: TyFun (Maybe a6989586621679544289) ((a6989586621679544289 ~> Maybe b6989586621679544290) ~> Maybe b6989586621679544290) -> Type) a1) a2
type MapM (arg1 :: a ~> m b) (arg2 :: Maybe a) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type MapM (arg1 :: a ~> m b) (arg2 :: Maybe a) = Apply (Apply (MapM_6989586621680747889Sym0 :: TyFun (a ~> m b) (Maybe a ~> m (Maybe b)) -> Type) arg1) arg2
type Traverse (a1 :: a6989586621680747832 ~> f6989586621680747831 b6989586621680747833) (a2 :: Maybe a6989586621680747832) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type Traverse (a1 :: a6989586621680747832 ~> f6989586621680747831 b6989586621680747833) (a2 :: Maybe a6989586621680747832) = Apply (Apply (Traverse_6989586621680753993Sym0 :: TyFun (a6989586621680747832 ~> f6989586621680747831 b6989586621680747833) (Maybe a6989586621680747832 ~> f6989586621680747831 (Maybe b6989586621680747833)) -> Type) a1) a2
type Foldl' (arg1 :: b ~> (a ~> b)) (arg2 :: b) (arg3 :: Maybe a) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Foldl' (arg1 :: b ~> (a ~> b)) (arg2 :: b) (arg3 :: Maybe a) = Apply (Apply (Apply (Foldl'_6989586621680451125Sym0 :: TyFun (b ~> (a ~> b)) (b ~> (Maybe a ~> b)) -> Type) arg1) arg2) arg3
type Foldl (a1 :: k2 ~> (a6989586621680450327 ~> k2)) (a2 :: k2) (a3 :: Maybe a6989586621680450327) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

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

Defined in Data.Singletons.Prelude.Foldable

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

Defined in Data.Singletons.Prelude.Foldable

type Foldr (a1 :: a6989586621680450322 ~> (k2 ~> k2)) (a2 :: k2) (a3 :: Maybe a6989586621680450322) = Apply (Apply (Apply (Foldr_6989586621680451332Sym0 :: TyFun (a6989586621680450322 ~> (k2 ~> k2)) (k2 ~> (Maybe a6989586621680450322 ~> k2)) -> Type) a1) a2) a3
type LiftA2 (a1 :: a6989586621679544268 ~> (b6989586621679544269 ~> c6989586621679544270)) (a2 :: Maybe a6989586621679544268) (a3 :: Maybe b6989586621679544269) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type LiftA2 (a1 :: a6989586621679544268 ~> (b6989586621679544269 ~> c6989586621679544270)) (a2 :: Maybe a6989586621679544268) (a3 :: Maybe b6989586621679544269) = Apply (Apply (Apply (LiftA2_6989586621679607446Sym0 :: TyFun (a6989586621679544268 ~> (b6989586621679544269 ~> c6989586621679544270)) (Maybe a6989586621679544268 ~> (Maybe b6989586621679544269 ~> Maybe c6989586621679544270)) -> Type) a1) a2) a3
type Apply (IsNothingSym0 :: TyFun (Maybe a) Bool -> Type) (a6989586621679494938 :: Maybe a) 
Instance details

Defined in Data.Singletons.Prelude.Maybe

type Apply (IsNothingSym0 :: TyFun (Maybe a) Bool -> Type) (a6989586621679494938 :: Maybe a) = IsNothing a6989586621679494938
type Apply (IsJustSym0 :: TyFun (Maybe a) Bool -> Type) (a6989586621679494940 :: Maybe a) 
Instance details

Defined in Data.Singletons.Prelude.Maybe

type Apply (IsJustSym0 :: TyFun (Maybe a) Bool -> Type) (a6989586621679494940 :: Maybe a) = IsJust a6989586621679494940
type Apply (FromJustSym0 :: TyFun (Maybe a) a -> Type) (a6989586621679494935 :: Maybe a) 
Instance details

Defined in Data.Singletons.Prelude.Maybe

type Apply (FromJustSym0 :: TyFun (Maybe a) a -> Type) (a6989586621679494935 :: Maybe a) = FromJust a6989586621679494935
type Apply (Compare_6989586621679390452Sym1 a6989586621679390450 :: TyFun (Maybe a) Ordering -> Type) (a6989586621679390451 :: Maybe a) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Apply (Compare_6989586621679390452Sym1 a6989586621679390450 :: TyFun (Maybe a) Ordering -> Type) (a6989586621679390451 :: Maybe a) = Compare_6989586621679390452 a6989586621679390450 a6989586621679390451
type Apply (FromMaybeSym1 a6989586621679494925 :: TyFun (Maybe a) a -> Type) (a6989586621679494926 :: Maybe a) 
Instance details

Defined in Data.Singletons.Prelude.Maybe

type Apply (FromMaybeSym1 a6989586621679494925 :: TyFun (Maybe a) a -> Type) (a6989586621679494926 :: Maybe a) = FromMaybe a6989586621679494925 a6989586621679494926
type Apply (Maybe_Sym2 a6989586621679493325 a6989586621679493324 :: TyFun (Maybe a) b -> Type) (a6989586621679493326 :: Maybe a) 
Instance details

Defined in Data.Singletons.Prelude.Maybe

type Apply (Maybe_Sym2 a6989586621679493325 a6989586621679493324 :: TyFun (Maybe a) b -> Type) (a6989586621679493326 :: Maybe a) = Maybe_ a6989586621679493325 a6989586621679493324 a6989586621679493326
type Rep (Maybe a)

Since: base-4.6.0.0

Instance details

Defined in GHC.Generics

type Rep (Maybe a) = D1 (MetaData "Maybe" "GHC.Maybe" "base" False) (C1 (MetaCons "Nothing" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Just" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a)))
data Sing (b :: Maybe a) 
Instance details

Defined in GHC.Generics

data Sing (b :: Maybe a) where
type DemoteRep (Maybe a) 
Instance details

Defined in GHC.Generics

type DemoteRep (Maybe a) = Maybe (DemoteRep a)
type Mempty 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Mempty = (Mempty_6989586621680328859Sym0 :: Maybe a)
data Sing (b :: Maybe a) 
Instance details

Defined in Data.Singletons.Prelude.Instances

data Sing (b :: Maybe a) where
type Demote (Maybe a) 
Instance details

Defined in Data.Singletons.Prelude.Instances

type Demote (Maybe a) = Maybe (Demote a)
type Rep1 Maybe

Since: base-4.6.0.0

Instance details

Defined in GHC.Generics

type ToPretty (t :: Maybe x)

Render a type of kind Maybe.

Since: pretty-types-0.2.1.0

Instance details

Defined in Data.Type.Pretty

type ToPretty (t :: Maybe x) = ToPrettyMaybe t
type Mconcat (arg :: [Maybe a]) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Mconcat (arg :: [Maybe a]) = Apply (Mconcat_6989586621680328808Sym0 :: TyFun [Maybe a] (Maybe a) -> Type) arg
type Show_ (arg :: Maybe a) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Show_ (arg :: Maybe a) = Apply (Show__6989586621680262307Sym0 :: TyFun (Maybe a) Symbol -> Type) arg
type Sconcat (arg :: NonEmpty (Maybe a)) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Sconcat (arg :: NonEmpty (Maybe a)) = Apply (Sconcat_6989586621679810578Sym0 :: TyFun (NonEmpty (Maybe a)) (Maybe a) -> Type) arg
type Mappend (arg1 :: Maybe a) (arg2 :: Maybe a) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Mappend (arg1 :: Maybe a) (arg2 :: Maybe a) = Apply (Apply (Mappend_6989586621680328798Sym0 :: TyFun (Maybe a) (Maybe a ~> Maybe a) -> Type) arg1) arg2
type ShowList (arg1 :: [Maybe a]) arg2 
Instance details

Defined in Data.Singletons.Prelude.Show

type ShowList (arg1 :: [Maybe a]) arg2 = Apply (Apply (ShowList_6989586621680262318Sym0 :: TyFun [Maybe a] (Symbol ~> Symbol) -> Type) arg1) arg2
type (a2 :: Maybe a1) <> (a3 :: Maybe a1) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type (a2 :: Maybe a1) <> (a3 :: Maybe a1) = Apply (Apply (TFHelper_6989586621679810751Sym0 :: TyFun (Maybe a1) (Maybe a1 ~> Maybe a1) -> Type) a2) a3
type Min (arg1 :: Maybe a) (arg2 :: Maybe a) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Min (arg1 :: Maybe a) (arg2 :: Maybe a) = Apply (Apply (Min_6989586621679379811Sym0 :: TyFun (Maybe a) (Maybe a ~> Maybe a) -> Type) arg1) arg2
type Max (arg1 :: Maybe a) (arg2 :: Maybe a) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Max (arg1 :: Maybe a) (arg2 :: Maybe a) = Apply (Apply (Max_6989586621679379793Sym0 :: TyFun (Maybe a) (Maybe a ~> Maybe a) -> Type) arg1) arg2
type (arg1 :: Maybe a) >= (arg2 :: Maybe a) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type (arg1 :: Maybe a) >= (arg2 :: Maybe a) = Apply (Apply (TFHelper_6989586621679379775Sym0 :: TyFun (Maybe a) (Maybe a ~> Bool) -> Type) arg1) arg2
type (arg1 :: Maybe a) > (arg2 :: Maybe a) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type (arg1 :: Maybe a) > (arg2 :: Maybe a) = Apply (Apply (TFHelper_6989586621679379757Sym0 :: TyFun (Maybe a) (Maybe a ~> Bool) -> Type) arg1) arg2
type (arg1 :: Maybe a) <= (arg2 :: Maybe a) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type (arg1 :: Maybe a) <= (arg2 :: Maybe a) = Apply (Apply (TFHelper_6989586621679379739Sym0 :: TyFun (Maybe a) (Maybe a ~> Bool) -> Type) arg1) arg2
type (arg1 :: Maybe a) < (arg2 :: Maybe a) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type (arg1 :: Maybe a) < (arg2 :: Maybe a) = Apply (Apply (TFHelper_6989586621679379721Sym0 :: TyFun (Maybe a) (Maybe a ~> Bool) -> Type) arg1) arg2
type Compare (a2 :: Maybe a1) (a3 :: Maybe a1) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Compare (a2 :: Maybe a1) (a3 :: Maybe a1) = Apply (Apply (Compare_6989586621679390452Sym0 :: TyFun (Maybe a1) (Maybe a1 ~> Ordering) -> Type) a2) a3
type (x :: Maybe a) /= (y :: Maybe a) 
Instance details

Defined in Data.Singletons.Prelude.Eq

type (x :: Maybe a) /= (y :: Maybe a) = Not (x == y)
type (a2 :: Maybe a1) == (b :: Maybe a1) 
Instance details

Defined in Data.Singletons.Prelude.Eq

type (a2 :: Maybe a1) == (b :: Maybe a1) = Equals_6989586621679364286 a2 b
type ShowsPrec a2 (a3 :: Maybe a1) a4 
Instance details

Defined in Data.Singletons.Prelude.Show

type ShowsPrec a2 (a3 :: Maybe a1) a4 = Apply (Apply (Apply (ShowsPrec_6989586621680280443Sym0 :: TyFun Nat (Maybe a1 ~> (Symbol ~> Symbol)) -> Type) a2) a3) a4
type Apply (Pure_6989586621679607418Sym0 :: TyFun a (Maybe a) -> Type) (a6989586621679607417 :: a) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type Apply (Pure_6989586621679607418Sym0 :: TyFun a (Maybe a) -> Type) (a6989586621679607417 :: a) = Pure_6989586621679607418 a6989586621679607417
type Apply (Fail_6989586621679607625Sym0 :: TyFun Symbol (Maybe a6989586621679544294) -> Type) (a6989586621679607624 :: Symbol) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type Apply (Fail_6989586621679607625Sym0 :: TyFun Symbol (Maybe a6989586621679544294) -> Type) (a6989586621679607624 :: Symbol) = (Fail_6989586621679607625 a6989586621679607624 :: Maybe a6989586621679544294)
type Apply (Let6989586621679607714LSym0 :: TyFun k1 (Maybe k1) -> Type) (wild_69895866216796068756989586621679607713 :: k1) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type Apply (Let6989586621679607714LSym0 :: TyFun k1 (Maybe k1) -> Type) (wild_69895866216796068756989586621679607713 :: k1) = Let6989586621679607714L wild_69895866216796068756989586621679607713
type Apply (JustSym0 :: TyFun a (Maybe a) -> Type) (t6989586621679294164 :: a) 
Instance details

Defined in Data.Singletons.Prelude.Instances

type Apply (JustSym0 :: TyFun a (Maybe a) -> Type) (t6989586621679294164 :: a) = Just t6989586621679294164
type Apply (Let6989586621680442109MSym1 x6989586621680442107 :: TyFun k (Maybe k1) -> Type) (y6989586621680442108 :: k) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Let6989586621680442109MSym1 x6989586621680442107 :: TyFun k (Maybe k1) -> Type) (y6989586621680442108 :: k) = Let6989586621680442109M x6989586621680442107 y6989586621680442108
type Apply (Let6989586621680442109NSym1 x6989586621680442107 :: TyFun k1 (Maybe k1) -> Type) (y6989586621680442108 :: k1) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Let6989586621680442109NSym1 x6989586621680442107 :: TyFun k1 (Maybe k1) -> Type) (y6989586621680442108 :: k1) = Let6989586621680442109N x6989586621680442107 y6989586621680442108
type Apply (Let6989586621680442136MSym1 x6989586621680442134 :: TyFun k (Maybe k1) -> Type) (y6989586621680442135 :: k) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Let6989586621680442136MSym1 x6989586621680442134 :: TyFun k (Maybe k1) -> Type) (y6989586621680442135 :: k) = Let6989586621680442136M x6989586621680442134 y6989586621680442135
type Apply (Let6989586621680442136NSym1 x6989586621680442134 :: TyFun k1 (Maybe k1) -> Type) (y6989586621680442135 :: k1) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Let6989586621680442136NSym1 x6989586621680442134 :: TyFun k1 (Maybe k1) -> Type) (y6989586621680442135 :: k1) = Let6989586621680442136N x6989586621680442134 y6989586621680442135
type Apply (Lambda_6989586621680338402Sym2 k6989586621680338401 a6989586621680338400 :: TyFun k1 (Maybe a) -> Type) (t6989586621680338413 :: k1) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (Lambda_6989586621680338402Sym2 k6989586621680338401 a6989586621680338400 :: TyFun k1 (Maybe a) -> Type) (t6989586621680338413 :: k1) = Lambda_6989586621680338402 k6989586621680338401 a6989586621680338400 t6989586621680338413
type Apply (Lambda_6989586621680338490Sym2 k6989586621680338489 a6989586621680338488 :: TyFun k1 (Maybe a) -> Type) (t6989586621680338501 :: k1) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (Lambda_6989586621680338490Sym2 k6989586621680338489 a6989586621680338488 :: TyFun k1 (Maybe a) -> Type) (t6989586621680338501 :: k1) = Lambda_6989586621680338490 k6989586621680338489 a6989586621680338488 t6989586621680338501
type Apply (Let6989586621680451161MfSym3 a6989586621680451162 xs6989586621680451160 f6989586621680451159 :: TyFun k3 (Maybe k3) -> Type) (a6989586621680451163 :: k3) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Let6989586621680451161MfSym3 a6989586621680451162 xs6989586621680451160 f6989586621680451159 :: TyFun k3 (Maybe k3) -> Type) (a6989586621680451163 :: k3) = Let6989586621680451161Mf a6989586621680451162 xs6989586621680451160 f6989586621680451159 a6989586621680451163
type Apply (CatMaybesSym0 :: TyFun [Maybe a] [a] -> Type) (a6989586621679494914 :: [Maybe a]) 
Instance details

Defined in Data.Singletons.Prelude.Maybe

type Apply (CatMaybesSym0 :: TyFun [Maybe a] [a] -> Type) (a6989586621679494914 :: [Maybe a]) = CatMaybes a6989586621679494914
type Apply (MaybeToListSym0 :: TyFun (Maybe a) [a] -> Type) (a6989586621679494922 :: Maybe a) 
Instance details

Defined in Data.Singletons.Prelude.Maybe

type Apply (MaybeToListSym0 :: TyFun (Maybe a) [a] -> Type) (a6989586621679494922 :: Maybe a) = MaybeToList a6989586621679494922
type Apply (ListToMaybeSym0 :: TyFun [a] (Maybe a) -> Type) (a6989586621679494919 :: [a]) 
Instance details

Defined in Data.Singletons.Prelude.Maybe

type Apply (ListToMaybeSym0 :: TyFun [a] (Maybe a) -> Type) (a6989586621679494919 :: [a]) = ListToMaybe a6989586621679494919
type Apply (GetOptionSym0 :: TyFun (Option a) (Maybe a) -> Type) (a6989586621679819760 :: Option a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (GetOptionSym0 :: TyFun (Option a) (Maybe a) -> Type) (a6989586621679819760 :: Option a) = GetOption a6989586621679819760
type Apply (GetFirstSym0 :: TyFun (First a) (Maybe a) -> Type) (a6989586621680332307 :: First a) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (GetFirstSym0 :: TyFun (First a) (Maybe a) -> Type) (a6989586621680332307 :: First a) = GetFirst a6989586621680332307
type Apply (GetLastSym0 :: TyFun (Last a) (Maybe a) -> Type) (a6989586621680332328 :: Last a) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (GetLastSym0 :: TyFun (Last a) (Maybe a) -> Type) (a6989586621680332328 :: Last a) = GetLast a6989586621680332328
type Apply (OptionSym0 :: TyFun (Maybe a) (Option a) -> Type) (t6989586621679819763 :: Maybe a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (OptionSym0 :: TyFun (Maybe a) (Option a) -> Type) (t6989586621679819763 :: Maybe a) = Option t6989586621679819763
type Apply (FirstSym0 :: TyFun (Maybe a) (First a) -> Type) (t6989586621680332310 :: Maybe a) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (FirstSym0 :: TyFun (Maybe a) (First a) -> Type) (t6989586621680332310 :: Maybe a) = First t6989586621680332310
type Apply (LastSym0 :: TyFun (Maybe a) (Last a) -> Type) (t6989586621680332331 :: Maybe a) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (LastSym0 :: TyFun (Maybe a) (Last a) -> Type) (t6989586621680332331 :: Maybe a) = Last t6989586621680332331
type Apply (MaxInternalSym0 :: TyFun (Maybe a) (MaxInternal a) -> Type) (t6989586621680441330 :: Maybe a) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (MaxInternalSym0 :: TyFun (Maybe a) (MaxInternal a) -> Type) (t6989586621680441330 :: Maybe a) = MaxInternal t6989586621680441330
type Apply (MinInternalSym0 :: TyFun (Maybe a) (MinInternal a) -> Type) (t6989586621680441530 :: Maybe a) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (MinInternalSym0 :: TyFun (Maybe a) (MinInternal a) -> Type) (t6989586621680441530 :: Maybe a) = MinInternal t6989586621680441530
type Apply (StripPrefixSym1 a6989586621680078217 :: TyFun [a] (Maybe [a]) -> Type) (a6989586621680078218 :: [a]) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (StripPrefixSym1 a6989586621680078217 :: TyFun [a] (Maybe [a]) -> Type) (a6989586621680078218 :: [a]) = StripPrefix a6989586621680078217 a6989586621680078218
type Apply (FindIndexSym1 a6989586621679949209 :: TyFun [a] (Maybe Nat) -> Type) (a6989586621679949210 :: [a]) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (FindIndexSym1 a6989586621679949209 :: TyFun [a] (Maybe Nat) -> Type) (a6989586621679949210 :: [a]) = FindIndex a6989586621679949209 a6989586621679949210
type Apply (ElemIndexSym1 a6989586621679949217 :: TyFun [a] (Maybe Nat) -> Type) (a6989586621679949218 :: [a]) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (ElemIndexSym1 a6989586621679949217 :: TyFun [a] (Maybe Nat) -> Type) (a6989586621679949218 :: [a]) = ElemIndex a6989586621679949217 a6989586621679949218
type Apply (TFHelper_6989586621679607718Sym1 a6989586621679607716 :: TyFun (Maybe a) (Maybe a) -> Type) (a6989586621679607717 :: Maybe a) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type Apply (TFHelper_6989586621679607718Sym1 a6989586621679607716 :: TyFun (Maybe a) (Maybe a) -> Type) (a6989586621679607717 :: Maybe a) = TFHelper_6989586621679607718 a6989586621679607716 a6989586621679607717
type Apply (FindSym1 a6989586621679948849 :: TyFun [a] (Maybe a) -> Type) (a6989586621679948850 :: [a]) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (FindSym1 a6989586621679948849 :: TyFun [a] (Maybe a) -> Type) (a6989586621679948850 :: [a]) = Find a6989586621679948849 a6989586621679948850
type Apply (Fmap_6989586621679607269Sym1 a6989586621679607267 :: TyFun (Maybe a) (Maybe b) -> Type) (a6989586621679607268 :: Maybe a) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type Apply (Fmap_6989586621679607269Sym1 a6989586621679607267 :: TyFun (Maybe a) (Maybe b) -> Type) (a6989586621679607268 :: Maybe a) = Fmap_6989586621679607269 a6989586621679607267 a6989586621679607268
type Apply (TFHelper_6989586621679607289Sym1 a6989586621679607287 b :: TyFun (Maybe b) (Maybe a) -> Type) (a6989586621679607288 :: Maybe b) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type Apply (TFHelper_6989586621679607289Sym1 a6989586621679607287 b :: TyFun (Maybe b) (Maybe a) -> Type) (a6989586621679607288 :: Maybe b) = TFHelper_6989586621679607289 a6989586621679607287 a6989586621679607288
type Apply (TFHelper_6989586621679607430Sym1 a6989586621679607428 :: TyFun (Maybe a) (Maybe b) -> Type) (a6989586621679607429 :: Maybe a) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type Apply (TFHelper_6989586621679607430Sym1 a6989586621679607428 :: TyFun (Maybe a) (Maybe b) -> Type) (a6989586621679607429 :: Maybe a) = TFHelper_6989586621679607430 a6989586621679607428 a6989586621679607429
type Apply (TFHelper_6989586621679607460Sym1 a6989586621679607458 b :: TyFun (Maybe b) (Maybe b) -> Type) (a6989586621679607459 :: Maybe b) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type Apply (TFHelper_6989586621679607460Sym1 a6989586621679607458 b :: TyFun (Maybe b) (Maybe b) -> Type) (a6989586621679607459 :: Maybe b) = TFHelper_6989586621679607460 a6989586621679607458 a6989586621679607459
type Apply (TFHelper_6989586621679607618Sym1 a6989586621679607616 b :: TyFun (Maybe b) (Maybe b) -> Type) (a6989586621679607617 :: Maybe b) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type Apply (TFHelper_6989586621679607618Sym1 a6989586621679607616 b :: TyFun (Maybe b) (Maybe b) -> Type) (a6989586621679607617 :: Maybe b) = TFHelper_6989586621679607618 a6989586621679607616 a6989586621679607617
type Apply (LookupSym1 a6989586621679948631 b :: TyFun [(a, b)] (Maybe b) -> Type) (a6989586621679948632 :: [(a, b)]) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (LookupSym1 a6989586621679948631 b :: TyFun [(a, b)] (Maybe b) -> Type) (a6989586621679948632 :: [(a, b)]) = Lookup a6989586621679948631 a6989586621679948632
type Apply (FindSym1 a6989586621680450684 t :: TyFun (t a) (Maybe a) -> Type) (a6989586621680450685 :: t a) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (FindSym1 a6989586621680450684 t :: TyFun (t a) (Maybe a) -> Type) (a6989586621680450685 :: t a) = Find a6989586621680450684 a6989586621680450685
type Apply (Traverse_6989586621680753993Sym1 a6989586621680753991 :: TyFun (Maybe a) (f (Maybe b)) -> Type) (a6989586621680753992 :: Maybe a) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type Apply (Traverse_6989586621680753993Sym1 a6989586621680753991 :: TyFun (Maybe a) (f (Maybe b)) -> Type) (a6989586621680753992 :: Maybe a) = Traverse_6989586621680753993 a6989586621680753991 a6989586621680753992
type Apply (LiftA2_6989586621679607446Sym2 a6989586621679607444 a6989586621679607443 :: TyFun (Maybe b) (Maybe c) -> Type) (a6989586621679607445 :: Maybe b) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type Apply (LiftA2_6989586621679607446Sym2 a6989586621679607444 a6989586621679607443 :: TyFun (Maybe b) (Maybe c) -> Type) (a6989586621679607445 :: Maybe b) = LiftA2_6989586621679607446 a6989586621679607444 a6989586621679607443 a6989586621679607445
type Apply (Let6989586621680451136MfSym3 a6989586621680451137 xs6989586621680451135 f6989586621680451134 :: TyFun (Maybe k2) (Maybe k3) -> Type) (a6989586621680451138 :: Maybe k2) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Let6989586621680451136MfSym3 a6989586621680451137 xs6989586621680451135 f6989586621680451134 :: TyFun (Maybe k2) (Maybe k3) -> Type) (a6989586621680451138 :: Maybe k2) = Let6989586621680451136Mf a6989586621680451137 xs6989586621680451135 f6989586621680451134 a6989586621680451138
type Apply (TFHelper_6989586621679607602Sym1 a6989586621679607600 b :: TyFun (a ~> Maybe b) (Maybe b) -> Type) (a6989586621679607601 :: a ~> Maybe b) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type Apply (TFHelper_6989586621679607602Sym1 a6989586621679607600 b :: TyFun (a ~> Maybe b) (Maybe b) -> Type) (a6989586621679607601 :: a ~> Maybe b) = TFHelper_6989586621679607602 a6989586621679607600 a6989586621679607601
type Check (a1 @&& a2 :: TyFun (Maybe ErrorMessage) (Maybe ErrorMessage) -> Type) (x :: Maybe ErrorMessage) Source # 
Instance details

Defined in Data.Type.BitRecords.Assert

type Check (a1 @&& a2 :: TyFun (Maybe ErrorMessage) (Maybe ErrorMessage) -> Type) (x :: Maybe ErrorMessage)
type Apply (ElemIndexSym0 :: TyFun a6989586621679939291 ([a6989586621679939291] ~> Maybe Nat) -> Type) (a6989586621679949217 :: a6989586621679939291) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (ElemIndexSym0 :: TyFun a6989586621679939291 ([a6989586621679939291] ~> Maybe Nat) -> Type) (a6989586621679949217 :: a6989586621679939291) = ElemIndexSym1 a6989586621679949217
type Apply (ShowsPrec_6989586621680280443Sym0 :: TyFun Nat (Maybe a3530822107858468865 ~> (Symbol ~> Symbol)) -> Type) (a6989586621680280440 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680280443Sym0 :: TyFun Nat (Maybe a3530822107858468865 ~> (Symbol ~> Symbol)) -> Type) (a6989586621680280440 :: Nat) = (ShowsPrec_6989586621680280443Sym1 a6989586621680280440 a3530822107858468865 :: TyFun (Maybe a3530822107858468865) (Symbol ~> Symbol) -> Type)
type Apply (FromMaybeSym0 :: TyFun a6989586621679494733 (Maybe a6989586621679494733 ~> a6989586621679494733) -> Type) (a6989586621679494925 :: a6989586621679494733) 
Instance details

Defined in Data.Singletons.Prelude.Maybe

type Apply (FromMaybeSym0 :: TyFun a6989586621679494733 (Maybe a6989586621679494733 ~> a6989586621679494733) -> Type) (a6989586621679494925 :: a6989586621679494733) = FromMaybeSym1 a6989586621679494925
type Apply (Let6989586621680442109MSym0 :: TyFun k1 (TyFun k (Maybe k1) -> Type) -> Type) (x6989586621680442107 :: k1) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Let6989586621680442109MSym0 :: TyFun k1 (TyFun k (Maybe k1) -> Type) -> Type) (x6989586621680442107 :: k1) = (Let6989586621680442109MSym1 x6989586621680442107 :: TyFun k (Maybe k1) -> Type)
type Apply (Let6989586621680442109NSym0 :: TyFun k (TyFun k1 (Maybe k1) -> Type) -> Type) (x6989586621680442107 :: k) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Let6989586621680442109NSym0 :: TyFun k (TyFun k1 (Maybe k1) -> Type) -> Type) (x6989586621680442107 :: k) = (Let6989586621680442109NSym1 x6989586621680442107 :: TyFun k1 (Maybe k1) -> Type)
type Apply (Let6989586621680442136MSym0 :: TyFun k1 (TyFun k (Maybe k1) -> Type) -> Type) (x6989586621680442134 :: k1) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Let6989586621680442136MSym0 :: TyFun k1 (TyFun k (Maybe k1) -> Type) -> Type) (x6989586621680442134 :: k1) = (Let6989586621680442136MSym1 x6989586621680442134 :: TyFun k (Maybe k1) -> Type)
type Apply (Let6989586621680442136NSym0 :: TyFun k (TyFun k1 (Maybe k1) -> Type) -> Type) (x6989586621680442134 :: k) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Let6989586621680442136NSym0 :: TyFun k (TyFun k1 (Maybe k1) -> Type) -> Type) (x6989586621680442134 :: k) = (Let6989586621680442136NSym1 x6989586621680442134 :: TyFun k1 (Maybe k1) -> Type)
type Apply (LookupSym0 :: TyFun a6989586621679939270 ([(a6989586621679939270, b6989586621679939271)] ~> Maybe b6989586621679939271) -> Type) (a6989586621679948631 :: a6989586621679939270) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (LookupSym0 :: TyFun a6989586621679939270 ([(a6989586621679939270, b6989586621679939271)] ~> Maybe b6989586621679939271) -> Type) (a6989586621679948631 :: a6989586621679939270) = (LookupSym1 a6989586621679948631 b6989586621679939271 :: TyFun [(a6989586621679939270, b6989586621679939271)] (Maybe b6989586621679939271) -> Type)
type Apply (TFHelper_6989586621679607289Sym0 :: TyFun a6989586621679544262 (Maybe b6989586621679544263 ~> Maybe a6989586621679544262) -> Type) (a6989586621679607287 :: a6989586621679544262) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type Apply (TFHelper_6989586621679607289Sym0 :: TyFun a6989586621679544262 (Maybe b6989586621679544263 ~> Maybe a6989586621679544262) -> Type) (a6989586621679607287 :: a6989586621679544262) = (TFHelper_6989586621679607289Sym1 a6989586621679607287 b6989586621679544263 :: TyFun (Maybe b6989586621679544263) (Maybe a6989586621679544262) -> Type)
type Apply (Maybe_Sym0 :: TyFun b6989586621679493306 ((a6989586621679493307 ~> b6989586621679493306) ~> (Maybe a6989586621679493307 ~> b6989586621679493306)) -> Type) (a6989586621679493324 :: b6989586621679493306) 
Instance details

Defined in Data.Singletons.Prelude.Maybe

type Apply (Maybe_Sym0 :: TyFun b6989586621679493306 ((a6989586621679493307 ~> b6989586621679493306) ~> (Maybe a6989586621679493307 ~> b6989586621679493306)) -> Type) (a6989586621679493324 :: b6989586621679493306) = (Maybe_Sym1 a6989586621679493324 a6989586621679493307 :: TyFun (a6989586621679493307 ~> b6989586621679493306) (Maybe a6989586621679493307 ~> b6989586621679493306) -> Type)
type Apply (Lambda_6989586621680338402Sym0 :: TyFun k (TyFun (k1 ~> First a) (TyFun k1 (Maybe a) -> Type) -> Type) -> Type) (a6989586621680338400 :: k) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (Lambda_6989586621680338402Sym0 :: TyFun k (TyFun (k1 ~> First a) (TyFun k1 (Maybe a) -> Type) -> Type) -> Type) (a6989586621680338400 :: k) = (Lambda_6989586621680338402Sym1 a6989586621680338400 :: TyFun (k1 ~> First a) (TyFun k1 (Maybe a) -> Type) -> Type)
type Apply (Lambda_6989586621680338490Sym0 :: TyFun k (TyFun (k1 ~> Last a) (TyFun k1 (Maybe a) -> Type) -> Type) -> Type) (a6989586621680338488 :: k) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (Lambda_6989586621680338490Sym0 :: TyFun k (TyFun (k1 ~> Last a) (TyFun k1 (Maybe a) -> Type) -> Type) -> Type) (a6989586621680338488 :: k) = (Lambda_6989586621680338490Sym1 a6989586621680338488 :: TyFun (k1 ~> Last a) (TyFun k1 (Maybe a) -> Type) -> Type)
type Apply (Let6989586621680451161MfSym1 f6989586621680451159 :: TyFun k (TyFun (Maybe k2) (TyFun k3 (Maybe k3) -> Type) -> Type) -> Type) (xs6989586621680451160 :: k) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Let6989586621680451161MfSym1 f6989586621680451159 :: TyFun k (TyFun (Maybe k2) (TyFun k3 (Maybe k3) -> Type) -> Type) -> Type) (xs6989586621680451160 :: k) = Let6989586621680451161MfSym2 f6989586621680451159 xs6989586621680451160
type Apply (Let6989586621680451136MfSym1 f6989586621680451134 :: TyFun k (TyFun k3 (TyFun (Maybe k2) (Maybe k3) -> Type) -> Type) -> Type) (xs6989586621680451135 :: k) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Let6989586621680451136MfSym1 f6989586621680451134 :: TyFun k (TyFun k3 (TyFun (Maybe k2) (Maybe k3) -> Type) -> Type) -> Type) (xs6989586621680451135 :: k) = Let6989586621680451136MfSym2 f6989586621680451134 xs6989586621680451135
type Apply (Let6989586621680451136MfSym2 xs6989586621680451135 f6989586621680451134 :: TyFun k3 (TyFun (Maybe k2) (Maybe k3) -> Type) -> Type) (a6989586621680451137 :: k3) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Let6989586621680451136MfSym2 xs6989586621680451135 f6989586621680451134 :: TyFun k3 (TyFun (Maybe k2) (Maybe k3) -> Type) -> Type) (a6989586621680451137 :: k3) = Let6989586621680451136MfSym3 xs6989586621680451135 f6989586621680451134 a6989586621680451137
type Apply (StripPrefixSym0 :: TyFun [a6989586621680065507] ([a6989586621680065507] ~> Maybe [a6989586621680065507]) -> Type) (a6989586621680078217 :: [a6989586621680065507]) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (StripPrefixSym0 :: TyFun [a6989586621680065507] ([a6989586621680065507] ~> Maybe [a6989586621680065507]) -> Type) (a6989586621680078217 :: [a6989586621680065507]) = StripPrefixSym1 a6989586621680078217
type Apply (TFHelper_6989586621679607718Sym0 :: TyFun (Maybe a6989586621679544343) (Maybe a6989586621679544343 ~> Maybe a6989586621679544343) -> Type) (a6989586621679607716 :: Maybe a6989586621679544343) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type Apply (TFHelper_6989586621679607718Sym0 :: TyFun (Maybe a6989586621679544343) (Maybe a6989586621679544343 ~> Maybe a6989586621679544343) -> Type) (a6989586621679607716 :: Maybe a6989586621679544343) = TFHelper_6989586621679607718Sym1 a6989586621679607716
type Apply (Compare_6989586621679390452Sym0 :: TyFun (Maybe a3530822107858468865) (Maybe a3530822107858468865 ~> Ordering) -> Type) (a6989586621679390450 :: Maybe a3530822107858468865) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Apply (Compare_6989586621679390452Sym0 :: TyFun (Maybe a3530822107858468865) (Maybe a3530822107858468865 ~> Ordering) -> Type) (a6989586621679390450 :: Maybe a3530822107858468865) = Compare_6989586621679390452Sym1 a6989586621679390450
type Apply (TFHelper_6989586621679607430Sym0 :: TyFun (Maybe (a6989586621679544266 ~> b6989586621679544267)) (Maybe a6989586621679544266 ~> Maybe b6989586621679544267) -> Type) (a6989586621679607428 :: Maybe (a6989586621679544266 ~> b6989586621679544267)) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type Apply (TFHelper_6989586621679607430Sym0 :: TyFun (Maybe (a6989586621679544266 ~> b6989586621679544267)) (Maybe a6989586621679544266 ~> Maybe b6989586621679544267) -> Type) (a6989586621679607428 :: Maybe (a6989586621679544266 ~> b6989586621679544267)) = TFHelper_6989586621679607430Sym1 a6989586621679607428
type Apply (TFHelper_6989586621679607460Sym0 :: TyFun (Maybe a6989586621679544271) (Maybe b6989586621679544272 ~> Maybe b6989586621679544272) -> Type) (a6989586621679607458 :: Maybe a6989586621679544271) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type Apply (TFHelper_6989586621679607460Sym0 :: TyFun (Maybe a6989586621679544271) (Maybe b6989586621679544272 ~> Maybe b6989586621679544272) -> Type) (a6989586621679607458 :: Maybe a6989586621679544271) = (TFHelper_6989586621679607460Sym1 a6989586621679607458 b6989586621679544272 :: TyFun (Maybe b6989586621679544272) (Maybe b6989586621679544272) -> Type)
type Apply (TFHelper_6989586621679607618Sym0 :: TyFun (Maybe a6989586621679544291) (Maybe b6989586621679544292 ~> Maybe b6989586621679544292) -> Type) (a6989586621679607616 :: Maybe a6989586621679544291) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type Apply (TFHelper_6989586621679607618Sym0 :: TyFun (Maybe a6989586621679544291) (Maybe b6989586621679544292 ~> Maybe b6989586621679544292) -> Type) (a6989586621679607616 :: Maybe a6989586621679544291) = (TFHelper_6989586621679607618Sym1 a6989586621679607616 b6989586621679544292 :: TyFun (Maybe b6989586621679544292) (Maybe b6989586621679544292) -> Type)
type Apply (ShowsPrec_6989586621680280443Sym1 a6989586621680280440 a3530822107858468865 :: TyFun (Maybe a3530822107858468865) (Symbol ~> Symbol) -> Type) (a6989586621680280441 :: Maybe a3530822107858468865) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680280443Sym1 a6989586621680280440 a3530822107858468865 :: TyFun (Maybe a3530822107858468865) (Symbol ~> Symbol) -> Type) (a6989586621680280441 :: Maybe a3530822107858468865) = ShowsPrec_6989586621680280443Sym2 a6989586621680280440 a6989586621680280441
type Apply (TFHelper_6989586621679607602Sym0 :: TyFun (Maybe a6989586621679544289) ((a6989586621679544289 ~> Maybe b6989586621679544290) ~> Maybe b6989586621679544290) -> Type) (a6989586621679607600 :: Maybe a6989586621679544289) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type Apply (TFHelper_6989586621679607602Sym0 :: TyFun (Maybe a6989586621679544289) ((a6989586621679544289 ~> Maybe b6989586621679544290) ~> Maybe b6989586621679544290) -> Type) (a6989586621679607600 :: Maybe a6989586621679544289) = (TFHelper_6989586621679607602Sym1 a6989586621679607600 b6989586621679544290 :: TyFun (a6989586621679544289 ~> Maybe b6989586621679544290) (Maybe b6989586621679544290) -> Type)
type Apply (LiftA2_6989586621679607446Sym1 a6989586621679607443 :: TyFun (Maybe a6989586621679544268) (Maybe b6989586621679544269 ~> Maybe c6989586621679544270) -> Type) (a6989586621679607444 :: Maybe a6989586621679544268) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type Apply (LiftA2_6989586621679607446Sym1 a6989586621679607443 :: TyFun (Maybe a6989586621679544268) (Maybe b6989586621679544269 ~> Maybe c6989586621679544270) -> Type) (a6989586621679607444 :: Maybe a6989586621679544268) = LiftA2_6989586621679607446Sym2 a6989586621679607443 a6989586621679607444
type Apply (Let6989586621680451161MfSym2 xs6989586621680451160 f6989586621680451159 :: TyFun (Maybe k2) (TyFun k3 (Maybe k3) -> Type) -> Type) (a6989586621680451162 :: Maybe k2) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Let6989586621680451161MfSym2 xs6989586621680451160 f6989586621680451159 :: TyFun (Maybe k2) (TyFun k3 (Maybe k3) -> Type) -> Type) (a6989586621680451162 :: Maybe k2) = Let6989586621680451161MfSym3 xs6989586621680451160 f6989586621680451159 a6989586621680451162
type (Optional fallback f :: A (Maybe s :-> IsA t) -> Type) $~ (Nothing :: Maybe s) Source # 
Instance details

Defined in Data.Kind.Extra

type (Optional fallback f :: A (Maybe s :-> IsA t) -> Type) $~ (Nothing :: Maybe s) = fallback
type (Optional fallback f :: A (Maybe foo :-> IsA t) -> Type) $~ (Just s :: Maybe foo) Source # 
Instance details

Defined in Data.Kind.Extra

type (Optional fallback f :: A (Maybe foo :-> IsA t) -> Type) $~ (Just s :: Maybe foo) = f $~ s
type Apply (FindSym0 :: TyFun (a6989586621679939292 ~> Bool) ([a6989586621679939292] ~> Maybe a6989586621679939292) -> Type) (a6989586621679948849 :: a6989586621679939292 ~> Bool) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (FindSym0 :: TyFun (a6989586621679939292 ~> Bool) ([a6989586621679939292] ~> Maybe a6989586621679939292) -> Type) (a6989586621679948849 :: a6989586621679939292 ~> Bool) = FindSym1 a6989586621679948849
type Apply (FindIndexSym0 :: TyFun (a6989586621679939289 ~> Bool) ([a6989586621679939289] ~> Maybe Nat) -> Type) (a6989586621679949209 :: a6989586621679939289 ~> Bool) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (FindIndexSym0 :: TyFun (a6989586621679939289 ~> Bool) ([a6989586621679939289] ~> Maybe Nat) -> Type) (a6989586621679949209 :: a6989586621679939289 ~> Bool) = FindIndexSym1 a6989586621679949209
type Apply (MapMaybeSym0 :: TyFun (a6989586621679494728 ~> Maybe b6989586621679494729) ([a6989586621679494728] ~> [b6989586621679494729]) -> Type) (a6989586621679494895 :: a6989586621679494728 ~> Maybe b6989586621679494729) 
Instance details

Defined in Data.Singletons.Prelude.Maybe

type Apply (MapMaybeSym0 :: TyFun (a6989586621679494728 ~> Maybe b6989586621679494729) ([a6989586621679494728] ~> [b6989586621679494729]) -> Type) (a6989586621679494895 :: a6989586621679494728 ~> Maybe b6989586621679494729) = MapMaybeSym1 a6989586621679494895
type Apply (Fmap_6989586621679607269Sym0 :: TyFun (a6989586621679544260 ~> b6989586621679544261) (Maybe a6989586621679544260 ~> Maybe b6989586621679544261) -> Type) (a6989586621679607267 :: a6989586621679544260 ~> b6989586621679544261) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type Apply (Fmap_6989586621679607269Sym0 :: TyFun (a6989586621679544260 ~> b6989586621679544261) (Maybe a6989586621679544260 ~> Maybe b6989586621679544261) -> Type) (a6989586621679607267 :: a6989586621679544260 ~> b6989586621679544261) = Fmap_6989586621679607269Sym1 a6989586621679607267
type Apply (UnfoldrSym0 :: TyFun (b6989586621679939348 ~> Maybe (a6989586621679939349, b6989586621679939348)) (b6989586621679939348 ~> [a6989586621679939349]) -> Type) (a6989586621679949282 :: b6989586621679939348 ~> Maybe (a6989586621679939349, b6989586621679939348)) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (UnfoldrSym0 :: TyFun (b6989586621679939348 ~> Maybe (a6989586621679939349, b6989586621679939348)) (b6989586621679939348 ~> [a6989586621679939349]) -> Type) (a6989586621679949282 :: b6989586621679939348 ~> Maybe (a6989586621679939349, b6989586621679939348)) = UnfoldrSym1 a6989586621679949282
type Apply (FindSym0 :: TyFun (a6989586621680450227 ~> Bool) (t6989586621680450226 a6989586621680450227 ~> Maybe a6989586621680450227) -> Type) (a6989586621680450684 :: a6989586621680450227 ~> Bool) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (FindSym0 :: TyFun (a6989586621680450227 ~> Bool) (t6989586621680450226 a6989586621680450227 ~> Maybe a6989586621680450227) -> Type) (a6989586621680450684 :: a6989586621680450227 ~> Bool) = (FindSym1 a6989586621680450684 t6989586621680450226 :: TyFun (t6989586621680450226 a6989586621680450227) (Maybe a6989586621680450227) -> Type)
type Apply (Let6989586621679494902RsSym0 :: TyFun (a6989586621679494728 ~> Maybe k1) (TyFun k (TyFun [a6989586621679494728] [k1] -> Type) -> Type) -> Type) (f6989586621679494899 :: a6989586621679494728 ~> Maybe k1) 
Instance details

Defined in Data.Singletons.Prelude.Maybe

type Apply (Let6989586621679494902RsSym0 :: TyFun (a6989586621679494728 ~> Maybe k1) (TyFun k (TyFun [a6989586621679494728] [k1] -> Type) -> Type) -> Type) (f6989586621679494899 :: a6989586621679494728 ~> Maybe k1) = (Let6989586621679494902RsSym1 f6989586621679494899 :: TyFun k (TyFun [a6989586621679494728] [k1] -> Type) -> Type)
type Apply (Let6989586621680451136MfSym0 :: TyFun (k3 ~> (k2 ~> k3)) (TyFun k (TyFun k3 (TyFun (Maybe k2) (Maybe k3) -> Type) -> Type) -> Type) -> Type) (f6989586621680451134 :: k3 ~> (k2 ~> k3)) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Let6989586621680451136MfSym0 :: TyFun (k3 ~> (k2 ~> k3)) (TyFun k (TyFun k3 (TyFun (Maybe k2) (Maybe k3) -> Type) -> Type) -> Type) -> Type) (f6989586621680451134 :: k3 ~> (k2 ~> k3)) = (Let6989586621680451136MfSym1 f6989586621680451134 :: TyFun k (TyFun k3 (TyFun (Maybe k2) (Maybe k3) -> Type) -> Type) -> Type)
type Apply (Let6989586621680451161MfSym0 :: TyFun (k2 ~> (k3 ~> k3)) (TyFun k (TyFun (Maybe k2) (TyFun k3 (Maybe k3) -> Type) -> Type) -> Type) -> Type) (f6989586621680451159 :: k2 ~> (k3 ~> k3)) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Let6989586621680451161MfSym0 :: TyFun (k2 ~> (k3 ~> k3)) (TyFun k (TyFun (Maybe k2) (TyFun k3 (Maybe k3) -> Type) -> Type) -> Type) -> Type) (f6989586621680451159 :: k2 ~> (k3 ~> k3)) = (Let6989586621680451161MfSym1 f6989586621680451159 :: TyFun k (TyFun (Maybe k2) (TyFun k3 (Maybe k3) -> Type) -> Type) -> Type)
type Apply (Traverse_6989586621680753993Sym0 :: TyFun (a6989586621680747832 ~> f6989586621680747831 b6989586621680747833) (Maybe a6989586621680747832 ~> f6989586621680747831 (Maybe b6989586621680747833)) -> Type) (a6989586621680753991 :: a6989586621680747832 ~> f6989586621680747831 b6989586621680747833) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type Apply (Traverse_6989586621680753993Sym0 :: TyFun (a6989586621680747832 ~> f6989586621680747831 b6989586621680747833) (Maybe a6989586621680747832 ~> f6989586621680747831 (Maybe b6989586621680747833)) -> Type) (a6989586621680753991 :: a6989586621680747832 ~> f6989586621680747831 b6989586621680747833) = Traverse_6989586621680753993Sym1 a6989586621680753991
type Apply (LiftA2_6989586621679607446Sym0 :: TyFun (a6989586621679544268 ~> (b6989586621679544269 ~> c6989586621679544270)) (Maybe a6989586621679544268 ~> (Maybe b6989586621679544269 ~> Maybe c6989586621679544270)) -> Type) (a6989586621679607443 :: a6989586621679544268 ~> (b6989586621679544269 ~> c6989586621679544270)) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type Apply (LiftA2_6989586621679607446Sym0 :: TyFun (a6989586621679544268 ~> (b6989586621679544269 ~> c6989586621679544270)) (Maybe a6989586621679544268 ~> (Maybe b6989586621679544269 ~> Maybe c6989586621679544270)) -> Type) (a6989586621679607443 :: a6989586621679544268 ~> (b6989586621679544269 ~> c6989586621679544270)) = LiftA2_6989586621679607446Sym1 a6989586621679607443
type Apply (Maybe_Sym1 a6989586621679493324 a6989586621679493307 :: TyFun (a6989586621679493307 ~> b6989586621679493306) (Maybe a6989586621679493307 ~> b6989586621679493306) -> Type) (a6989586621679493325 :: a6989586621679493307 ~> b6989586621679493306) 
Instance details

Defined in Data.Singletons.Prelude.Maybe

type Apply (Maybe_Sym1 a6989586621679493324 a6989586621679493307 :: TyFun (a6989586621679493307 ~> b6989586621679493306) (Maybe a6989586621679493307 ~> b6989586621679493306) -> Type) (a6989586621679493325 :: a6989586621679493307 ~> b6989586621679493306) = Maybe_Sym2 a6989586621679493324 a6989586621679493325
type Apply (Lambda_6989586621680338402Sym1 a6989586621680338400 :: TyFun (k1 ~> First a) (TyFun k1 (Maybe a) -> Type) -> Type) (k6989586621680338401 :: k1 ~> First a) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (Lambda_6989586621680338402Sym1 a6989586621680338400 :: TyFun (k1 ~> First a) (TyFun k1 (Maybe a) -> Type) -> Type) (k6989586621680338401 :: k1 ~> First a) = Lambda_6989586621680338402Sym2 a6989586621680338400 k6989586621680338401
type Apply (Lambda_6989586621680338490Sym1 a6989586621680338488 :: TyFun (k1 ~> Last a) (TyFun k1 (Maybe a) -> Type) -> Type) (k6989586621680338489 :: k1 ~> Last a) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (Lambda_6989586621680338490Sym1 a6989586621680338488 :: TyFun (k1 ~> Last a) (TyFun k1 (Maybe a) -> Type) -> Type) (k6989586621680338489 :: k1 ~> Last a) = Lambda_6989586621680338490Sym2 a6989586621680338488 k6989586621680338489

class a ~# b => (a :: k0) ~~ (b :: k1) #

Lifted, heterogeneous equality. By lifted, we mean that it can be bogus (deferred type error). By heterogeneous, the two types a and b might have different kinds. Because ~~ can appear unexpectedly in error messages to users who do not care about the difference between heterogeneous equality ~~ and homogeneous equality ~, this is printed as ~ unless -fprint-equality-relations is set.

data Word #

A Word is an unsigned integral type, with the same size as Int.

Instances
Bounded Word

Since: base-2.1

Instance details

Defined in GHC.Enum

Enum Word

Since: base-2.1

Instance details

Defined in GHC.Enum

Methods

succ :: Word -> Word #

pred :: Word -> Word #

toEnum :: Int -> Word #

fromEnum :: Word -> Int #

enumFrom :: Word -> [Word] #

enumFromThen :: Word -> Word -> [Word] #

enumFromTo :: Word -> Word -> [Word] #

enumFromThenTo :: Word -> Word -> Word -> [Word] #

Eq Word 
Instance details

Defined in GHC.Classes

Methods

(==) :: Word -> Word -> Bool #

(/=) :: Word -> Word -> Bool #

Integral Word

Since: base-2.1

Instance details

Defined in GHC.Real

Methods

quot :: Word -> Word -> Word #

rem :: Word -> Word -> Word #

div :: Word -> Word -> Word #

mod :: Word -> Word -> Word #

quotRem :: Word -> Word -> (Word, Word) #

divMod :: Word -> Word -> (Word, Word) #

toInteger :: Word -> Integer #

Num Word

Since: base-2.1

Instance details

Defined in GHC.Num

Methods

(+) :: Word -> Word -> Word #

(-) :: Word -> Word -> Word #

(*) :: Word -> Word -> Word #

negate :: Word -> Word #

abs :: Word -> Word #

signum :: Word -> Word #

fromInteger :: Integer -> Word #

Ord Word 
Instance details

Defined in GHC.Classes

Methods

compare :: Word -> Word -> Ordering #

(<) :: Word -> Word -> Bool #

(<=) :: Word -> Word -> Bool #

(>) :: Word -> Word -> Bool #

(>=) :: Word -> Word -> Bool #

max :: Word -> Word -> Word #

min :: Word -> Word -> Word #

Read Word

Since: base-4.5.0.0

Instance details

Defined in GHC.Read

Real Word

Since: base-2.1

Instance details

Defined in GHC.Real

Methods

toRational :: Word -> Rational #

Show Word

Since: base-2.1

Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> Word -> ShowS #

show :: Word -> String #

showList :: [Word] -> ShowS #

Ix Word

Since: base-4.6.0.0

Instance details

Defined in GHC.Arr

Methods

range :: (Word, Word) -> [Word] #

index :: (Word, Word) -> Word -> Int #

unsafeIndex :: (Word, Word) -> Word -> Int

inRange :: (Word, Word) -> Word -> Bool #

rangeSize :: (Word, Word) -> Int #

unsafeRangeSize :: (Word, Word) -> Int

Lift Word 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

lift :: Word -> Q Exp #

PrintfArg Word

Since: base-2.1

Instance details

Defined in Text.Printf

Storable Word

Since: base-2.1

Instance details

Defined in Foreign.Storable

Methods

sizeOf :: Word -> Int #

alignment :: Word -> Int #

peekElemOff :: Ptr Word -> Int -> IO Word #

pokeElemOff :: Ptr Word -> Int -> Word -> IO () #

peekByteOff :: Ptr b -> Int -> IO Word #

pokeByteOff :: Ptr b -> Int -> Word -> IO () #

peek :: Ptr Word -> IO Word #

poke :: Ptr Word -> Word -> IO () #

Bits Word

Since: base-2.1

Instance details

Defined in Data.Bits

FiniteBits Word

Since: base-4.6.0.0

Instance details

Defined in Data.Bits

Default Word 
Instance details

Defined in Data.Default.Class

Methods

def :: Word #

Prim Word 
Instance details

Defined in Data.Primitive.Types

Unbox Word 
Instance details

Defined in Data.Vector.Unboxed.Base

Vector Vector Word 
Instance details

Defined in Data.Vector.Unboxed.Base

MVector MVector Word 
Instance details

Defined in Data.Vector.Unboxed.Base

Generic1 (URec Word :: k -> Type) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep1 (URec Word) :: k -> Type #

Methods

from1 :: URec Word a -> Rep1 (URec Word) a #

to1 :: Rep1 (URec Word) a -> URec Word a #

Functor (URec Word :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

fmap :: (a -> b) -> URec Word a -> URec Word b #

(<$) :: a -> URec Word b -> URec Word a #

Foldable (URec Word :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => URec Word m -> m #

foldMap :: Monoid m => (a -> m) -> URec Word a -> m #

foldr :: (a -> b -> b) -> b -> URec Word a -> b #

foldr' :: (a -> b -> b) -> b -> URec Word a -> b #

foldl :: (b -> a -> b) -> b -> URec Word a -> b #

foldl' :: (b -> a -> b) -> b -> URec Word a -> b #

foldr1 :: (a -> a -> a) -> URec Word a -> a #

foldl1 :: (a -> a -> a) -> URec Word a -> a #

toList :: URec Word a -> [a] #

null :: URec Word a -> Bool #

length :: URec Word a -> Int #

elem :: Eq a => a -> URec Word a -> Bool #

maximum :: Ord a => URec Word a -> a #

minimum :: Ord a => URec Word a -> a #

sum :: Num a => URec Word a -> a #

product :: Num a => URec Word a -> a #

Traversable (URec Word :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Traversable

Methods

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

sequenceA :: Applicative f => URec Word (f a) -> f (URec Word a) #

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

sequence :: Monad m => URec Word (m a) -> m (URec Word a) #

Eq (URec Word p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

(==) :: URec Word p -> URec Word p -> Bool #

(/=) :: URec Word p -> URec Word p -> Bool #

Ord (URec Word p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

compare :: URec Word p -> URec Word p -> Ordering #

(<) :: URec Word p -> URec Word p -> Bool #

(<=) :: URec Word p -> URec Word p -> Bool #

(>) :: URec Word p -> URec Word p -> Bool #

(>=) :: URec Word p -> URec Word p -> Bool #

max :: URec Word p -> URec Word p -> URec Word p #

min :: URec Word p -> URec Word p -> URec Word p #

Show (URec Word p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

showsPrec :: Int -> URec Word p -> ShowS #

show :: URec Word p -> String #

showList :: [URec Word p] -> ShowS #

Generic (URec Word p) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (URec Word p) :: Type -> Type #

Methods

from :: URec Word p -> Rep (URec Word p) x #

to :: Rep (URec Word p) x -> URec Word p #

newtype Vector Word 
Instance details

Defined in Data.Vector.Unboxed.Base

data URec Word (p :: k)

Used for marking occurrences of Word#

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

data URec Word (p :: k) = UWord {}
newtype MVector s Word 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype MVector s Word = MV_Word (MVector s Word)
type Rep1 (URec Word :: k -> Type)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

type Rep1 (URec Word :: k -> Type) = D1 (MetaData "URec" "GHC.Generics" "base" False) (C1 (MetaCons "UWord" PrefixI True) (S1 (MetaSel (Just "uWord#") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (UWord :: k -> Type)))
type Rep (URec Word p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

type Rep (URec Word p) = D1 (MetaData "URec" "GHC.Generics" "base" False) (C1 (MetaCons "UWord" PrefixI True) (S1 (MetaSel (Just "uWord#") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (UWord :: Type -> Type)))

data Word8 #

8-bit unsigned integer type

Instances
Bounded Word8

Since: base-2.1

Instance details

Defined in GHC.Word

Enum Word8

Since: base-2.1

Instance details

Defined in GHC.Word

Eq Word8

Since: base-2.1

Instance details

Defined in GHC.Word

Methods

(==) :: Word8 -> Word8 -> Bool #

(/=) :: Word8 -> Word8 -> Bool #

Integral Word8

Since: base-2.1

Instance details

Defined in GHC.Word

Num Word8

Since: base-2.1

Instance details

Defined in GHC.Word

Ord Word8

Since: base-2.1

Instance details

Defined in GHC.Word

Methods

compare :: Word8 -> Word8 -> Ordering #

(<) :: Word8 -> Word8 -> Bool #

(<=) :: Word8 -> Word8 -> Bool #

(>) :: Word8 -> Word8 -> Bool #

(>=) :: Word8 -> Word8 -> Bool #

max :: Word8 -> Word8 -> Word8 #

min :: Word8 -> Word8 -> Word8 #

Read Word8

Since: base-2.1

Instance details

Defined in GHC.Read

Real Word8

Since: base-2.1

Instance details

Defined in GHC.Word

Methods

toRational :: Word8 -> Rational #

Show Word8

Since: base-2.1

Instance details

Defined in GHC.Word

Methods

showsPrec :: Int -> Word8 -> ShowS #

show :: Word8 -> String #

showList :: [Word8] -> ShowS #

Ix Word8

Since: base-2.1

Instance details

Defined in GHC.Word

Lift Word8 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

lift :: Word8 -> Q Exp #

PrintfArg Word8

Since: base-2.1

Instance details

Defined in Text.Printf

Storable Word8

Since: base-2.1

Instance details

Defined in Foreign.Storable

Methods

sizeOf :: Word8 -> Int #

alignment :: Word8 -> Int #

peekElemOff :: Ptr Word8 -> Int -> IO Word8 #

pokeElemOff :: Ptr Word8 -> Int -> Word8 -> IO () #

peekByteOff :: Ptr b -> Int -> IO Word8 #

pokeByteOff :: Ptr b -> Int -> Word8 -> IO () #

peek :: Ptr Word8 -> IO Word8 #

poke :: Ptr Word8 -> Word8 -> IO () #

Bits Word8

Since: base-2.1

Instance details

Defined in GHC.Word

FiniteBits Word8

Since: base-4.6.0.0

Instance details

Defined in GHC.Word

Default Word8 
Instance details

Defined in Data.Default.Class

Methods

def :: Word8 #

Prim Word8 
Instance details

Defined in Data.Primitive.Types

Unbox Word8 
Instance details

Defined in Data.Vector.Unboxed.Base

IsBoxContent Word8 Source # 
Instance details

Defined in Data.ByteString.IsoBaseFileFormat.Box

Vector Vector Word8 
Instance details

Defined in Data.Vector.Unboxed.Base

MVector MVector Word8 
Instance details

Defined in Data.Vector.Unboxed.Base

BitStringBuilderHoley (Proxy (MkField MkFieldU8)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

Associated Types

type ToBitStringBuilder (Proxy (MkField MkFieldU8)) a :: Type Source #

IsBoxContent (Scalar Word8 label) Source # 
Instance details

Defined in Data.ByteString.IsoBaseFileFormat.Util.BoxFields

newtype Vector Word8 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype MVector s Word8 
Instance details

Defined in Data.Vector.Unboxed.Base

type ToPretty Word8

Render Word8 as PutStr Word8

Since: pretty-types-0.2.1.0

Instance details

Defined in Data.Type.Pretty

type ToPretty Word8 = PutStr "Word8"
type ToBitStringBuilder (Proxy (MkField MkFieldU8)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

data Word16 #

16-bit unsigned integer type

Instances
Bounded Word16

Since: base-2.1

Instance details

Defined in GHC.Word

Enum Word16

Since: base-2.1

Instance details

Defined in GHC.Word

Eq Word16

Since: base-2.1

Instance details

Defined in GHC.Word

Methods

(==) :: Word16 -> Word16 -> Bool #

(/=) :: Word16 -> Word16 -> Bool #

Integral Word16

Since: base-2.1

Instance details

Defined in GHC.Word

Num Word16

Since: base-2.1

Instance details

Defined in GHC.Word

Ord Word16

Since: base-2.1

Instance details

Defined in GHC.Word

Read Word16

Since: base-2.1

Instance details

Defined in GHC.Read

Real Word16

Since: base-2.1

Instance details

Defined in GHC.Word

Show Word16

Since: base-2.1

Instance details

Defined in GHC.Word

Ix Word16

Since: base-2.1

Instance details

Defined in GHC.Word

Lift Word16 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

lift :: Word16 -> Q Exp #

PrintfArg Word16

Since: base-2.1

Instance details

Defined in Text.Printf

Storable Word16

Since: base-2.1

Instance details

Defined in Foreign.Storable

Bits Word16

Since: base-2.1

Instance details

Defined in GHC.Word

FiniteBits Word16

Since: base-4.6.0.0

Instance details

Defined in GHC.Word

Default Word16 
Instance details

Defined in Data.Default.Class

Methods

def :: Word16 #

Prim Word16 
Instance details

Defined in Data.Primitive.Types

Unbox Word16 
Instance details

Defined in Data.Vector.Unboxed.Base

IsBoxContent Word16 Source # 
Instance details

Defined in Data.ByteString.IsoBaseFileFormat.Box

Vector Vector Word16 
Instance details

Defined in Data.Vector.Unboxed.Base

MVector MVector Word16 
Instance details

Defined in Data.Vector.Unboxed.Base

BitStringBuilderHoley (Proxy (MkField MkFieldU16)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

Associated Types

type ToBitStringBuilder (Proxy (MkField MkFieldU16)) a :: Type Source #

IsBoxContent (Scalar Word16 label) Source # 
Instance details

Defined in Data.ByteString.IsoBaseFileFormat.Util.BoxFields

newtype Vector Word16 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype MVector s Word16 
Instance details

Defined in Data.Vector.Unboxed.Base

type ToPretty Word16

Render Word16 as PutStr Word16

Since: pretty-types-0.2.1.0

Instance details

Defined in Data.Type.Pretty

type ToPretty Word16 = PutStr "Word16"
type ToBitStringBuilder (Proxy (MkField MkFieldU16)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

data Word32 #

32-bit unsigned integer type

Instances
Bounded Word32

Since: base-2.1

Instance details

Defined in GHC.Word

Enum Word32

Since: base-2.1

Instance details

Defined in GHC.Word

Eq Word32

Since: base-2.1

Instance details

Defined in GHC.Word

Methods

(==) :: Word32 -> Word32 -> Bool #

(/=) :: Word32 -> Word32 -> Bool #

Integral Word32

Since: base-2.1

Instance details

Defined in GHC.Word

Num Word32

Since: base-2.1

Instance details

Defined in GHC.Word

Ord Word32

Since: base-2.1

Instance details

Defined in GHC.Word

Read Word32

Since: base-2.1

Instance details

Defined in GHC.Read

Real Word32

Since: base-2.1

Instance details

Defined in GHC.Word

Show Word32

Since: base-2.1

Instance details

Defined in GHC.Word

Ix Word32

Since: base-2.1

Instance details

Defined in GHC.Word

Lift Word32 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

lift :: Word32 -> Q Exp #

PrintfArg Word32

Since: base-2.1

Instance details

Defined in Text.Printf

Storable Word32

Since: base-2.1

Instance details

Defined in Foreign.Storable

Bits Word32

Since: base-2.1

Instance details

Defined in GHC.Word

FiniteBits Word32

Since: base-4.6.0.0

Instance details

Defined in GHC.Word

Default Word32 
Instance details

Defined in Data.Default.Class

Methods

def :: Word32 #

Prim Word32 
Instance details

Defined in Data.Primitive.Types

Unbox Word32 
Instance details

Defined in Data.Vector.Unboxed.Base

IsBoxContent Word32 Source # 
Instance details

Defined in Data.ByteString.IsoBaseFileFormat.Box

IsBox ChunkOffsetTable32 Source # 
Instance details

Defined in Data.ByteString.IsoBaseFileFormat.Boxes.ChunkOffset

Associated Types

type BoxContent ChunkOffsetTable32 :: Type Source #

Vector Vector Word32 
Instance details

Defined in Data.Vector.Unboxed.Base

MVector MVector Word32 
Instance details

Defined in Data.Vector.Unboxed.Base

BitStringBuilderHoley (Proxy (MkField MkFieldU32)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

Associated Types

type ToBitStringBuilder (Proxy (MkField MkFieldU32)) a :: Type Source #

IsBoxContent (Scalar Word32 label) Source # 
Instance details

Defined in Data.ByteString.IsoBaseFileFormat.Util.BoxFields

newtype Vector Word32 
Instance details

Defined in Data.Vector.Unboxed.Base

type BoxContent ChunkOffsetTable32 Source # 
Instance details

Defined in Data.ByteString.IsoBaseFileFormat.Boxes.ChunkOffset

newtype MVector s Word32 
Instance details

Defined in Data.Vector.Unboxed.Base

type ToPretty Word32

Render Word32 as PutStr Word32

Since: pretty-types-0.2.1.0

Instance details

Defined in Data.Type.Pretty

type ToPretty Word32 = PutStr "Word32"
type BoxTypeSymbol ChunkOffsetTable32 Source # 
Instance details

Defined in Data.ByteString.IsoBaseFileFormat.Boxes.ChunkOffset

type ToBitStringBuilder (Proxy (MkField MkFieldU32)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

data Word64 #

64-bit unsigned integer type

Instances
Bounded Word64

Since: base-2.1

Instance details

Defined in GHC.Word

Enum Word64

Since: base-2.1

Instance details

Defined in GHC.Word

Eq Word64

Since: base-2.1

Instance details

Defined in GHC.Word

Methods

(==) :: Word64 -> Word64 -> Bool #

(/=) :: Word64 -> Word64 -> Bool #

Integral Word64

Since: base-2.1

Instance details

Defined in GHC.Word

Num Word64

Since: base-2.1

Instance details

Defined in GHC.Word

Ord Word64

Since: base-2.1

Instance details

Defined in GHC.Word

Read Word64

Since: base-2.1

Instance details

Defined in GHC.Read

Real Word64

Since: base-2.1

Instance details

Defined in GHC.Word

Show Word64

Since: base-2.1

Instance details

Defined in GHC.Word

Ix Word64

Since: base-2.1

Instance details

Defined in GHC.Word

Lift Word64 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

lift :: Word64 -> Q Exp #

PrintfArg Word64

Since: base-2.1

Instance details

Defined in Text.Printf

Storable Word64

Since: base-2.1

Instance details

Defined in Foreign.Storable

Bits Word64

Since: base-2.1

Instance details

Defined in GHC.Word

FiniteBits Word64

Since: base-4.6.0.0

Instance details

Defined in GHC.Word

Default Word64 
Instance details

Defined in Data.Default.Class

Methods

def :: Word64 #

Prim Word64 
Instance details

Defined in Data.Primitive.Types

Unbox Word64 
Instance details

Defined in Data.Vector.Unboxed.Base

IsBoxContent Word64 Source # 
Instance details

Defined in Data.ByteString.IsoBaseFileFormat.Box

IsBox ChunkOffsetTable64 Source # 
Instance details

Defined in Data.ByteString.IsoBaseFileFormat.Boxes.ChunkOffset

Associated Types

type BoxContent ChunkOffsetTable64 :: Type Source #

Vector Vector Word64 
Instance details

Defined in Data.Vector.Unboxed.Base

MVector MVector Word64 
Instance details

Defined in Data.Vector.Unboxed.Base

BitStringBuilderHoley (Proxy (MkField MkFieldU64)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

Associated Types

type ToBitStringBuilder (Proxy (MkField MkFieldU64)) a :: Type Source #

IsBoxContent (Scalar Word64 label) Source # 
Instance details

Defined in Data.ByteString.IsoBaseFileFormat.Util.BoxFields

newtype Vector Word64 
Instance details

Defined in Data.Vector.Unboxed.Base

type BoxContent ChunkOffsetTable64 Source # 
Instance details

Defined in Data.ByteString.IsoBaseFileFormat.Boxes.ChunkOffset

newtype MVector s Word64 
Instance details

Defined in Data.Vector.Unboxed.Base

type ToPretty Word64

Render Word64 as PutStr Word64

Since: pretty-types-0.2.1.0

Instance details

Defined in Data.Type.Pretty

type ToPretty Word64 = PutStr "Word64"
type BoxTypeSymbol ChunkOffsetTable64 Source # 
Instance details

Defined in Data.ByteString.IsoBaseFileFormat.Boxes.ChunkOffset

type ToBitStringBuilder (Proxy (MkField MkFieldU64)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

type Type = Type #

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

data Constraint #

The kind of constraints, like Show a

data Nat #

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

Instances
PShow Nat 
Instance details

Defined in Data.Singletons.Prelude.Show

Associated Types

type ShowsPrec arg arg1 arg2 :: Symbol #

type Show_ arg :: Symbol #

type ShowList arg arg1 :: Symbol #

SShow Nat 
Instance details

Defined in Data.Singletons.Prelude.Show

Methods

sShowsPrec :: Sing t1 -> Sing t2 -> Sing t3 -> Sing (Apply (Apply (Apply ShowsPrecSym0 t1) t2) t3) #

sShow_ :: Sing t -> Sing (Apply Show_Sym0 t) #

sShowList :: Sing t1 -> Sing t2 -> Sing (Apply (Apply ShowListSym0 t1) t2) #

PEnum Nat 
Instance details

Defined in Data.Singletons.Prelude.Enum

Associated Types

type Succ arg :: a #

type Pred arg :: a #

type ToEnum arg :: a #

type FromEnum arg :: Nat #

type EnumFromTo arg arg1 :: [a] #

type EnumFromThenTo arg arg1 arg2 :: [a] #

SEnum Nat 
Instance details

Defined in Data.Singletons.Prelude.Enum

PNum Nat 
Instance details

Defined in Data.Singletons.Prelude.Num

Associated Types

type arg + arg1 :: a #

type arg - arg1 :: a #

type arg * arg1 :: a #

type Negate arg :: a #

type Abs arg :: a #

type Signum arg :: a #

type FromInteger arg :: a #

SNum Nat 
Instance details

Defined in Data.Singletons.Prelude.Num

Methods

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

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

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

sNegate :: Sing t -> Sing (Apply NegateSym0 t) #

sAbs :: Sing t -> Sing (Apply AbsSym0 t) #

sSignum :: Sing t -> Sing (Apply SignumSym0 t) #

sFromInteger :: Sing t -> Sing (Apply FromIntegerSym0 t) #

(KnownNat scalar, Num o) => FromTypeLit (Scalar o label) (scalar :: Nat) Source # 
Instance details

Defined in Data.ByteString.IsoBaseFileFormat.Util.BoxFields

Methods

fromTypeLit :: proxy (Scalar o label) scalar -> Scalar o label Source #

(KnownSymbol label, SingI arr, Num o, SingKind [Nat], KnownNat len, len ~ Length arr) => FromTypeLit (ScalarArray label len o) (arr :: [Nat]) Source # 
Instance details

Defined in Data.ByteString.IsoBaseFileFormat.Util.BoxFields

Methods

fromTypeLit :: proxy (ScalarArray label len o) arr -> ScalarArray label len o Source #

KnownNat bits => Bits (BoxFlags bits) Source # 
Instance details

Defined in Data.ByteString.IsoBaseFileFormat.Util.FullBox

Methods

(.&.) :: BoxFlags bits -> BoxFlags bits -> BoxFlags bits #

(.|.) :: BoxFlags bits -> BoxFlags bits -> BoxFlags bits #

xor :: BoxFlags bits -> BoxFlags bits -> BoxFlags bits #

complement :: BoxFlags bits -> BoxFlags bits #

shift :: BoxFlags bits -> Int -> BoxFlags bits #

rotate :: BoxFlags bits -> Int -> BoxFlags bits #

zeroBits :: BoxFlags bits #

bit :: Int -> BoxFlags bits #

setBit :: BoxFlags bits -> Int -> BoxFlags bits #

clearBit :: BoxFlags bits -> Int -> BoxFlags bits #

complementBit :: BoxFlags bits -> Int -> BoxFlags bits #

testBit :: BoxFlags bits -> Int -> Bool #

bitSizeMaybe :: BoxFlags bits -> Maybe Int #

bitSize :: BoxFlags bits -> Int #

isSigned :: BoxFlags bits -> Bool #

shiftL :: BoxFlags bits -> Int -> BoxFlags bits #

unsafeShiftL :: BoxFlags bits -> Int -> BoxFlags bits #

shiftR :: BoxFlags bits -> Int -> BoxFlags bits #

unsafeShiftR :: BoxFlags bits -> Int -> BoxFlags bits #

rotateL :: BoxFlags bits -> Int -> BoxFlags bits #

rotateR :: BoxFlags bits -> Int -> BoxFlags bits #

popCount :: BoxFlags bits -> Int #

KnownNat bits => IsBoxContent (BoxFlags bits) Source #

Get the number of bytes required to store a number of bits.

Instance details

Defined in Data.ByteString.IsoBaseFileFormat.Util.FullBox

SuppressUnusedWarnings FromEnum_6989586621679763353Sym0 
Instance details

Defined in Data.Singletons.Prelude.Enum

SuppressUnusedWarnings FromEnum_6989586621679763377Sym0 
Instance details

Defined in Data.Singletons.Prelude.Enum

SuppressUnusedWarnings ToEnum_6989586621679763347Sym0 
Instance details

Defined in Data.Singletons.Prelude.Enum

SuppressUnusedWarnings ToEnum_6989586621679763371Sym0 
Instance details

Defined in Data.Singletons.Prelude.Enum

SuppressUnusedWarnings KnownNatSym0 
Instance details

Defined in Data.Singletons.TypeLits

SuppressUnusedWarnings Log2Sym0 
Instance details

Defined in Data.Singletons.TypeLits

SuppressUnusedWarnings ToEnum_6989586621679763388Sym0 
Instance details

Defined in Data.Singletons.Prelude.Enum

SuppressUnusedWarnings ShowsPrec_6989586621680280557Sym0 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings ShowsPrec_6989586621680280584Sym0 
Instance details

Defined in Data.Singletons.Prelude.Show

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

Defined in Data.Singletons.TypeLits.Internal

SuppressUnusedWarnings EftNatSym0 
Instance details

Defined in Data.Singletons.Prelude.Enum

SuppressUnusedWarnings RemSym0 
Instance details

Defined in Data.Singletons.TypeLits

SuppressUnusedWarnings QuotSym0 
Instance details

Defined in Data.Singletons.TypeLits

SuppressUnusedWarnings ModSym0 
Instance details

Defined in Data.Singletons.TypeLits

SuppressUnusedWarnings DivSym0 
Instance details

Defined in Data.Singletons.TypeLits

SuppressUnusedWarnings (^@#@$) 
Instance details

Defined in Data.Singletons.TypeLits.Internal

SuppressUnusedWarnings DivModSym0 
Instance details

Defined in Data.Singletons.TypeLits

SuppressUnusedWarnings QuotRemSym0 
Instance details

Defined in Data.Singletons.TypeLits

SuppressUnusedWarnings EfdtNatDnSym0 
Instance details

Defined in Data.Singletons.Prelude.Enum

SuppressUnusedWarnings EfdtNatSym0 
Instance details

Defined in Data.Singletons.Prelude.Enum

SuppressUnusedWarnings EfdtNatUpSym0 
Instance details

Defined in Data.Singletons.Prelude.Enum

SuppressUnusedWarnings ShowsNatSym0 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings ShowsPrec_6989586621680262357Sym0 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings ShowsPrec_6989586621680280406Sym0 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings ShowsPrec_6989586621680280612Sym0 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings ShowsPrec_6989586621680865201Sym0 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings ShowsPrec_6989586621680865227Sym0 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings FromEnum_6989586621679763394Sym0 
Instance details

Defined in Data.Singletons.Prelude.Enum

SingI Log2Sym0 
Instance details

Defined in Data.Singletons.TypeLits

Methods

sing :: Sing Log2Sym0 #

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

Defined in Data.Singletons.TypeLits.Internal

Methods

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

SingI ModSym0 
Instance details

Defined in Data.Singletons.TypeLits

Methods

sing :: Sing ModSym0 #

SingI DivSym0 
Instance details

Defined in Data.Singletons.TypeLits

Methods

sing :: Sing DivSym0 #

SingI (^@#@$) 
Instance details

Defined in Data.Singletons.TypeLits.Internal

Methods

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

SingI EftNatSym0 
Instance details

Defined in Data.Singletons.Prelude.Enum

Methods

sing :: Sing EftNatSym0 #

SingI EfdtNatDnSym0 
Instance details

Defined in Data.Singletons.Prelude.Enum

Methods

sing :: Sing EfdtNatDnSym0 #

SingI EfdtNatSym0 
Instance details

Defined in Data.Singletons.Prelude.Enum

Methods

sing :: Sing EfdtNatSym0 #

SingI EfdtNatUpSym0 
Instance details

Defined in Data.Singletons.Prelude.Enum

Methods

sing :: Sing EfdtNatUpSym0 #

BitStringBuilderHoley (Proxy (MkField MkFieldU8)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

Associated Types

type ToBitStringBuilder (Proxy (MkField MkFieldU8)) a :: Type Source #

BitStringBuilderHoley (Proxy (MkField MkFieldU16)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

Associated Types

type ToBitStringBuilder (Proxy (MkField MkFieldU16)) a :: Type Source #

BitStringBuilderHoley (Proxy (MkField MkFieldU32)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

Associated Types

type ToBitStringBuilder (Proxy (MkField MkFieldU32)) a :: Type Source #

BitStringBuilderHoley (Proxy (MkField MkFieldU64)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

Associated Types

type ToBitStringBuilder (Proxy (MkField MkFieldU64)) a :: Type Source #

(KnownNat v, BitStringBuilderHoley (Proxy f) a, ToBitStringBuilder (Proxy f) a ~ (rt -> a), Num rt) => BitStringBuilderHoley (Proxy (f := v)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

Associated Types

type ToBitStringBuilder (Proxy (f := v)) a :: Type Source #

KnownChunkSize s => BitStringBuilderHoley (Proxy (MkField (MkFieldBits :: BitField (B s) Nat s))) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

Associated Types

type ToBitStringBuilder (Proxy (MkField MkFieldBits)) a :: Type Source #

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

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

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

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

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

Defined in Data.Singletons.Prelude.List.Internal

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

Defined in Data.Singletons.Prelude.List.Internal

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

Defined in Data.Singletons.TypeLits.Internal

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

Defined in Data.Singletons.Prelude.Enum

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

Defined in Data.Singletons.TypeLits

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

Defined in Data.Singletons.TypeLits

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

Defined in Data.Singletons.TypeLits

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

Defined in Data.Singletons.TypeLits

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

Defined in Data.Singletons.TypeLits.Internal

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

Defined in Data.Singletons.TypeLits

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

Defined in Data.Singletons.TypeLits

SuppressUnusedWarnings (FromInteger_6989586621679505158Sym0 :: TyFun Nat a6989586621679505019 -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Num

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

Defined in Data.Singletons.Prelude.Num

SuppressUnusedWarnings (ToEnum_6989586621679739834Sym0 :: TyFun Nat a6989586621679739461 -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Enum

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

Defined in Data.Singletons.Prelude.Enum

SuppressUnusedWarnings (ToEnum_6989586621680881919Sym0 :: TyFun Nat (Min a6989586621680881171) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (FromInteger_6989586621680882094Sym0 :: TyFun Nat (Min a6989586621680881186) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (ToEnum_6989586621680882218Sym0 :: TyFun Nat (Max a6989586621680881203) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (FromInteger_6989586621680882393Sym0 :: TyFun Nat (Max a6989586621680881218) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (ToEnum_6989586621680882743Sym0 :: TyFun Nat (First a6989586621680881257) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (ToEnum_6989586621680882971Sym0 :: TyFun Nat (Last a6989586621680881278) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (ToEnum_6989586621680883155Sym0 :: TyFun Nat (WrappedMonoid a6989586621680881295) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (ToEnum_6989586621680675506Sym0 :: TyFun Nat (Identity a6989586621680675102) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Identity

SuppressUnusedWarnings (FromInteger_6989586621680675608Sym0 :: TyFun Nat (Identity a6989586621680675113) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Identity

SuppressUnusedWarnings (FromInteger_6989586621679837944Sym0 :: TyFun Nat (Sum a6989586621679837584) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (FromInteger_6989586621679838084Sym0 :: TyFun Nat (Product a6989586621679837602) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (ShowsPrec_6989586621680262337Sym0 :: TyFun Nat ([a6989586621680260343] ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

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

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

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

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

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

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

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

Defined in Data.Singletons.Prelude.List.Internal

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

Defined in Data.Singletons.Prelude.List.Internal

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

Defined in Data.Singletons.Prelude.List.Internal

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

Defined in Data.Singletons.Prelude.Show

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

Defined in Data.Singletons.Prelude.Enum

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

Defined in Data.Singletons.Prelude.Enum

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

Defined in Data.Singletons.Prelude.Enum

SuppressUnusedWarnings (ShowsPrec_6989586621680262298Sym0 :: TyFun Nat (a6989586621680260325 ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

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

Defined in Data.Singletons.Prelude.Show

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

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (ShowsPrec_6989586621680865314Sym0 :: TyFun Nat (Min a6989586621679050961 ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (ShowsPrec_6989586621680865343Sym0 :: TyFun Nat (Max a6989586621679050967 ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (ShowsPrec_6989586621680865372Sym0 :: TyFun Nat (First a6989586621679050981 ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (ShowsPrec_6989586621680865401Sym0 :: TyFun Nat (Last a6989586621679050987 ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (ShowsPrec_6989586621680865430Sym0 :: TyFun Nat (WrappedMonoid m6989586621679050993 ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (ShowsPrec_6989586621680865146Sym0 :: TyFun Nat (Option a6989586621679050999 ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (ShowsPrec_6989586621680675637Sym0 :: TyFun Nat (Identity a6989586621680675127 ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Identity

SuppressUnusedWarnings (ShowsPrec_6989586621680335234Sym0 :: TyFun Nat (First a6989586621679072624 ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

SuppressUnusedWarnings (ShowsPrec_6989586621680335263Sym0 :: TyFun Nat (Last a6989586621679072619 ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

SuppressUnusedWarnings (ShowsPrec_6989586621680865175Sym0 :: TyFun Nat (Dual a6989586621679072595 ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (ShowsPrec_6989586621680865256Sym0 :: TyFun Nat (Sum a6989586621679072580 ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (ShowsPrec_6989586621680865285Sym0 :: TyFun Nat (Product a6989586621679072585 ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (ShowsPrec_6989586621680280531Sym0 :: TyFun Nat (NonEmpty a6989586621679055391 ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

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

Defined in Data.Singletons.Prelude.List.Internal

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

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (FromEnum_6989586621679739841Sym0 :: TyFun a6989586621679739461 Nat -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Enum

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

Defined in Data.Singletons.Prelude.Enum

SuppressUnusedWarnings (FromEnum_6989586621680881926Sym0 :: TyFun (Min a6989586621680881171) Nat -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (FromEnum_6989586621680882225Sym0 :: TyFun (Max a6989586621680881203) Nat -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (FromEnum_6989586621680882750Sym0 :: TyFun (First a6989586621680881257) Nat -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (FromEnum_6989586621680882978Sym0 :: TyFun (Last a6989586621680881278) Nat -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (FromEnum_6989586621680883162Sym0 :: TyFun (WrappedMonoid a6989586621680881295) Nat -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (Length_6989586621680675796Sym0 :: TyFun (Identity a6989586621680450334) Nat -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Identity

SuppressUnusedWarnings (FromEnum_6989586621680675513Sym0 :: TyFun (Identity a6989586621680675102) Nat -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Identity

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

Defined in Data.Singletons.Prelude.List.Internal

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

Defined in Data.Singletons.Prelude.List.Internal

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

Defined in Data.Singletons.TypeLits.Internal

Methods

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

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

Defined in Data.Singletons.TypeLits

Methods

sing :: Sing (ModSym1 x) #

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

Defined in Data.Singletons.TypeLits

Methods

sing :: Sing (DivSym1 x) #

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

Defined in Data.Singletons.TypeLits.Internal

Methods

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

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

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

Methods

sing :: Sing ListlengthSym0 #

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

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

Methods

sing :: Sing ListindexSym0 #

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

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing LengthSym0 #

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

Defined in Data.Singletons.Prelude.List.Internal

Methods

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

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

Defined in Data.Singletons.Prelude.Enum

Methods

sing :: Sing (EftNatSym1 d) #

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

Defined in Data.Singletons.Prelude.Num

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

Defined in Data.Singletons.Prelude.Enum

Methods

sing :: Sing ToEnumSym0 #

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

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

Methods

sing :: Sing ListtakeSym0 #

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

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

Methods

sing :: Sing ListsplitAtSym0 #

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

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

Methods

sing :: Sing ListdropSym0 #

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

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing TakeSym0 #

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

Defined in Data.Singletons.Prelude.List.Internal

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

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing DropSym0 #

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

Defined in Data.Singletons.Prelude.Enum

Methods

sing :: Sing (EfdtNatDnSym1 d) #

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

Defined in Data.Singletons.Prelude.Enum

Methods

sing :: Sing (EfdtNatSym1 d) #

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

Defined in Data.Singletons.Prelude.Enum

Methods

sing :: Sing (EfdtNatUpSym1 d) #

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

Defined in Data.Singletons.Prelude.Show

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

Defined in Data.Singletons.Prelude.List.Internal

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

Defined in Data.Singletons.Prelude.List.Internal

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

Defined in Data.Singletons.Prelude.List.Internal

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

Defined in Data.Singletons.Prelude.Enum

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

Defined in Data.Singletons.Prelude.List.Internal

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

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (FindIndicesSym1 a6989586621679949175 :: TyFun [a6989586621679939288] [Nat] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (FindIndexSym1 a6989586621679949209 :: TyFun [a6989586621679939289] (Maybe Nat) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (ElemIndicesSym1 a6989586621679949201 :: TyFun [a6989586621679939290] [Nat] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (ElemIndexSym1 a6989586621679949217 :: TyFun [a6989586621679939291] (Maybe Nat) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (EfdtNatDnSym2 a6989586621679739583 a6989586621679739582 :: TyFun Nat [Nat] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Enum

SuppressUnusedWarnings (EfdtNatSym2 a6989586621679739697 a6989586621679739696 :: TyFun Nat [Nat] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Enum

SuppressUnusedWarnings (EfdtNatUpSym2 a6989586621679739640 a6989586621679739639 :: TyFun Nat [Nat] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Enum

SuppressUnusedWarnings (ListindexSym1 a6989586621680404192 :: TyFun Nat a6989586621680404052 -> Type) 
Instance details

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

SuppressUnusedWarnings ((!!@#@$$) a6989586621679948552 :: TyFun Nat a6989586621679939262 -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (ShowsPrec_6989586621680280497Sym0 :: TyFun Nat (Either a6989586621679073691 b6989586621679073692 ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (ShowsPrec_6989586621680262374Sym0 :: TyFun Nat ((a6989586621680260347, b6989586621680260348) ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (ShowsPrec_6989586621680882596Sym0 :: TyFun Nat (Arg a6989586621680881245 b6989586621680881246 ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

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

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing (FindIndicesSym1 d) #

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

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing (FindIndexSym1 d) #

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

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing (ElemIndicesSym1 d) #

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

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing (ElemIndexSym1 d) #

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

Defined in Data.Singletons.Prelude.Enum

Methods

sing :: Sing (EfdtNatDnSym2 d1 d2) #

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

Defined in Data.Singletons.Prelude.Enum

Methods

sing :: Sing (EfdtNatSym2 d1 d2) #

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

Defined in Data.Singletons.Prelude.Enum

Methods

sing :: Sing (EfdtNatUpSym2 d1 d2) #

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

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

Methods

sing :: Sing (ListindexSym1 d) #

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

Defined in Data.Singletons.Prelude.List.Internal

Methods

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

SuppressUnusedWarnings (ToEnum_6989586621680711020Sym0 :: TyFun Nat (Const a6989586621680710503 b6989586621680710504) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Const

SuppressUnusedWarnings (FromInteger_6989586621680711122Sym0 :: TyFun Nat (Const a6989586621680710516 b6989586621680710517) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Const

SuppressUnusedWarnings (ShowsPrec_6989586621680262392Sym0 :: TyFun Nat ((a6989586621680260352, b6989586621680260353, c6989586621680260354) ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (ShowsPrec_6989586621680711151Sym0 :: TyFun Nat (Const a6989586621680710532 b6989586621680710533 ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Const

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

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (Length_6989586621680452141Sym0 :: TyFun (t6989586621680450318 a6989586621680450334) Nat -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (Length_6989586621680451974Sym0 :: TyFun (t6989586621680450318 a6989586621680450334) Nat -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (Length_6989586621680451807Sym0 :: TyFun (t6989586621680450318 a6989586621680450334) Nat -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (Length_6989586621680451672Sym0 :: TyFun (t6989586621680450318 a6989586621680450334) Nat -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (Length_6989586621680451478Sym0 :: TyFun (t6989586621680450318 a6989586621680450334) Nat -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (Length_6989586621680451229Sym0 :: TyFun (t6989586621680450318 a6989586621680450334) Nat -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (LengthSym0 :: TyFun (t6989586621680450318 a6989586621680450334) Nat -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (FromEnum_6989586621680711027Sym0 :: TyFun (Const a6989586621680710503 b6989586621680710504) Nat -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Const

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

Defined in Data.Singletons.Prelude.Foldable

Methods

sing :: Sing LengthSym0 #

SuppressUnusedWarnings (ShowsPrec_6989586621680262411Sym0 :: TyFun Nat ((a6989586621680260359, b6989586621680260360, c6989586621680260361, d6989586621680260362) ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (Let6989586621679949181BuildListSym1 p6989586621679949179 :: TyFun k1 (TyFun Nat ([b6989586621679939741] ~> [Nat]) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (Let6989586621679949181BuildListSym2 xs6989586621679949180 p6989586621679949179 b6989586621679939741 :: TyFun Nat ([b6989586621679939741] ~> [Nat]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (ShowsPrec_6989586621680262431Sym0 :: TyFun Nat ((a6989586621680260368, b6989586621680260369, c6989586621680260370, d6989586621680260371, e6989586621680260372) ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (Let6989586621679949181BuildListSym3 a6989586621679949182 xs6989586621679949180 p6989586621679949179 b6989586621679939741 :: TyFun [b6989586621679939741] [Nat] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (ShowsPrec_6989586621680262452Sym0 :: TyFun Nat ((a6989586621680260379, b6989586621680260380, c6989586621680260381, d6989586621680260382, e6989586621680260383, f6989586621680260384) ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (ShowsPrec_6989586621680262474Sym0 :: TyFun Nat ((a6989586621680260392, b6989586621680260393, c6989586621680260394, d6989586621680260395, e6989586621680260396, f6989586621680260397, g6989586621680260398) ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

data Sing (n :: Nat) 
Instance details

Defined in Data.Singletons.TypeLits.Internal

data Sing (n :: Nat) where
type Demote Nat 
Instance details

Defined in Data.Singletons.TypeLits.Internal

type ToPretty (t :: Nat)

A type of kind Nat is translated to PutNat.

Since: pretty-types-0.2.1.0

Instance details

Defined in Data.Type.Pretty

type ToPretty (t :: Nat) = PutNat t
type Show_ (arg :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Show

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

Defined in Data.Singletons.Prelude.Enum

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

Defined in Data.Singletons.Prelude.Enum

type ToEnum a = Apply (ToEnum_6989586621679739834Sym0 :: TyFun Nat Nat -> Type) a
type Pred (a :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Enum

type Pred (a :: Nat) = Apply (Pred_6989586621679739827Sym0 :: TyFun Nat Nat -> Type) a
type Succ (a :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Enum

type Succ (a :: Nat) = Apply (Succ_6989586621679739820Sym0 :: TyFun Nat Nat -> Type) a
type FromInteger a 
Instance details

Defined in Data.Singletons.Prelude.Num

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

Defined in Data.Singletons.Prelude.Num

type Signum (a :: Nat) = SignumNat a
type Abs (a :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Num

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

Defined in Data.Singletons.Prelude.Num

type Negate (a :: Nat) = (Error "Cannot negate a natural number" :: Nat)
type ShowList (arg1 :: [Nat]) arg2 
Instance details

Defined in Data.Singletons.Prelude.Show

type ShowList (arg1 :: [Nat]) arg2 = Apply (Apply (ShowList_6989586621680262318Sym0 :: TyFun [Nat] (Symbol ~> Symbol) -> Type) arg1) arg2
type EnumFromTo (a1 :: Nat) (a2 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Enum

type EnumFromTo (a1 :: Nat) (a2 :: Nat) = Apply (Apply (EnumFromTo_6989586621679739856Sym0 :: TyFun Nat (Nat ~> [Nat]) -> Type) a1) a2
type (a :: Nat) * (b :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Num

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

Defined in Data.Singletons.Prelude.Num

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

Defined in Data.Singletons.Prelude.Num

type (a :: Nat) + (b :: Nat) = a + b
type Min (arg1 :: Nat) (arg2 :: Nat) 
Instance details

Defined in Data.Singletons.TypeLits.Internal

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

Defined in Data.Singletons.TypeLits.Internal

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

Defined in Data.Singletons.TypeLits.Internal

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

Defined in Data.Singletons.TypeLits.Internal

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

Defined in Data.Singletons.TypeLits.Internal

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

Defined in Data.Singletons.TypeLits.Internal

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

Defined in Data.Singletons.TypeLits.Internal

type Compare (a :: Nat) (b :: Nat) = CmpNat a b
type (x :: Nat) /= (y :: Nat) 
Instance details

Defined in Data.Singletons.TypeLits.Internal

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

Defined in Data.Singletons.TypeLits.Internal

type (x :: Nat) == (y :: Nat) = DefaultEq x y
type ShowsPrec _ (n :: Nat) x 
Instance details

Defined in Data.Singletons.Prelude.Show

type ShowsPrec _ (n :: Nat) x = ShowsNat n x
type EnumFromThenTo (a1 :: Nat) (a2 :: Nat) (a3 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Enum

type EnumFromThenTo (a1 :: Nat) (a2 :: Nat) (a3 :: Nat) = Apply (Apply (Apply (EnumFromThenTo_6989586621679739878Sym0 :: TyFun Nat (Nat ~> (Nat ~> [Nat])) -> Type) a1) a2) a3
type Apply ToEnum_6989586621679763347Sym0 (a6989586621679763346 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Enum

type Apply ToEnum_6989586621679763347Sym0 (a6989586621679763346 :: Nat) = ToEnum_6989586621679763347 a6989586621679763346
type Apply ToEnum_6989586621679763371Sym0 (a6989586621679763370 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Enum

type Apply ToEnum_6989586621679763371Sym0 (a6989586621679763370 :: Nat) = ToEnum_6989586621679763371 a6989586621679763370
type Apply KnownNatSym0 (n6989586621679467044 :: Nat) 
Instance details

Defined in Data.Singletons.TypeLits

type Apply KnownNatSym0 (n6989586621679467044 :: Nat) = KnownNat n6989586621679467044
type Apply FromEnum_6989586621679763353Sym0 (a6989586621679763352 :: Bool) 
Instance details

Defined in Data.Singletons.Prelude.Enum

type Apply FromEnum_6989586621679763353Sym0 (a6989586621679763352 :: Bool) = FromEnum_6989586621679763353 a6989586621679763352
type Apply FromEnum_6989586621679763377Sym0 (a6989586621679763376 :: Ordering) 
Instance details

Defined in Data.Singletons.Prelude.Enum

type Apply FromEnum_6989586621679763377Sym0 (a6989586621679763376 :: Ordering) = FromEnum_6989586621679763377 a6989586621679763376
type Apply Log2Sym0 (a3530822107858468865 :: Nat) 
Instance details

Defined in Data.Singletons.TypeLits

type Apply Log2Sym0 (a3530822107858468865 :: Nat) = Log2 a3530822107858468865
type Apply FromEnum_6989586621679763394Sym0 (a6989586621679763393 :: ()) 
Instance details

Defined in Data.Singletons.Prelude.Enum

type Apply FromEnum_6989586621679763394Sym0 (a6989586621679763393 :: ()) = FromEnum_6989586621679763394 a6989586621679763393
type Apply ToEnum_6989586621679763388Sym0 (a6989586621679763387 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Enum

type Apply ToEnum_6989586621679763388Sym0 (a6989586621679763387 :: Nat) = ToEnum_6989586621679763388 a6989586621679763387
type Apply ((<=?@#@$$) a3530822107858468865 :: TyFun Nat Bool -> Type) (b3530822107858468866 :: Nat) 
Instance details

Defined in Data.Singletons.TypeLits.Internal

type Apply ((<=?@#@$$) a3530822107858468865 :: TyFun Nat Bool -> Type) (b3530822107858468866 :: Nat) = a3530822107858468865 <=? b3530822107858468866
type Apply (RemSym1 a6989586621679486524 :: TyFun Nat Nat -> Type) (a6989586621679486525 :: Nat) 
Instance details

Defined in Data.Singletons.TypeLits

type Apply (RemSym1 a6989586621679486524 :: TyFun Nat Nat -> Type) (a6989586621679486525 :: Nat) = Rem a6989586621679486524 a6989586621679486525
type Apply (QuotSym1 a6989586621679486534 :: TyFun Nat Nat -> Type) (a6989586621679486535 :: Nat) 
Instance details

Defined in Data.Singletons.TypeLits

type Apply (QuotSym1 a6989586621679486534 :: TyFun Nat Nat -> Type) (a6989586621679486535 :: Nat) = Quot a6989586621679486534 a6989586621679486535
type Apply (ModSym1 a3530822107858468865 :: TyFun Nat Nat -> Type) (b3530822107858468866 :: Nat) 
Instance details

Defined in Data.Singletons.TypeLits

type Apply (ModSym1 a3530822107858468865 :: TyFun Nat Nat -> Type) (b3530822107858468866 :: Nat) = Mod a3530822107858468865 b3530822107858468866
type Apply (DivSym1 a3530822107858468865 :: TyFun Nat Nat -> Type) (b3530822107858468866 :: Nat) 
Instance details

Defined in Data.Singletons.TypeLits

type Apply (DivSym1 a3530822107858468865 :: TyFun Nat Nat -> Type) (b3530822107858468866 :: Nat) = Div a3530822107858468865 b3530822107858468866
type Apply ((^@#@$$) a3530822107858468865 :: TyFun Nat Nat -> Type) (b3530822107858468866 :: Nat) 
Instance details

Defined in Data.Singletons.TypeLits.Internal

type Apply ((^@#@$$) a3530822107858468865 :: TyFun Nat Nat -> Type) (b3530822107858468866 :: Nat) = a3530822107858468865 ^ b3530822107858468866
type Apply (FromEnumSym0 :: TyFun a Nat -> Type) (arg6989586621679739751 :: a) 
Instance details

Defined in Data.Singletons.Prelude.Enum

type Apply (FromEnumSym0 :: TyFun a Nat -> Type) (arg6989586621679739751 :: a) = FromEnum arg6989586621679739751
type Apply (FromEnum_6989586621679739841Sym0 :: TyFun a Nat -> Type) (a6989586621679739840 :: a) 
Instance details

Defined in Data.Singletons.Prelude.Enum

type Apply (FromEnum_6989586621679739841Sym0 :: TyFun a Nat -> Type) (a6989586621679739840 :: a) = FromEnum_6989586621679739841 a6989586621679739840
type Apply (FromIntegerSym0 :: TyFun Nat k2 -> Type) (arg6989586621679505057 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Num

type Apply (FromIntegerSym0 :: TyFun Nat k2 -> Type) (arg6989586621679505057 :: Nat) = (FromInteger arg6989586621679505057 :: k2)
type Apply (FromInteger_6989586621679505158Sym0 :: TyFun Nat k2 -> Type) (a6989586621679505157 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Num

type Apply (FromInteger_6989586621679505158Sym0 :: TyFun Nat k2 -> Type) (a6989586621679505157 :: Nat) = (FromInteger_6989586621679505158 a6989586621679505157 :: k2)
type Apply (ToEnumSym0 :: TyFun Nat k2 -> Type) (arg6989586621679739749 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Enum

type Apply (ToEnumSym0 :: TyFun Nat k2 -> Type) (arg6989586621679739749 :: Nat) = (ToEnum arg6989586621679739749 :: k2)
type Apply (ToEnum_6989586621679739834Sym0 :: TyFun Nat k2 -> Type) (a6989586621679739833 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Enum

type Apply (ToEnum_6989586621679739834Sym0 :: TyFun Nat k2 -> Type) (a6989586621679739833 :: Nat) = (ToEnum_6989586621679739834 a6989586621679739833 :: k2)
type Apply (ListindexSym1 a6989586621680404192 :: TyFun Nat a -> Type) (a6989586621680404193 :: Nat) 
Instance details

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

type Apply (ListindexSym1 a6989586621680404192 :: TyFun Nat a -> Type) (a6989586621680404193 :: Nat) = Listindex a6989586621680404192 a6989586621680404193
type Apply ((!!@#@$$) a6989586621679948552 :: TyFun Nat a -> Type) (a6989586621679948553 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply ((!!@#@$$) a6989586621679948552 :: TyFun Nat a -> Type) (a6989586621679948553 :: Nat) = a6989586621679948552 !! a6989586621679948553
type Check (NatLE n :: TyFun Nat (Maybe ErrorMessage) -> Type) (x :: Nat) Source # 
Instance details

Defined in Data.Type.BitRecords.Assert

type Check (NatLE n :: TyFun Nat (Maybe ErrorMessage) -> Type) (x :: Nat) = If (x <=? n) (Nothing :: Maybe ErrorMessage) (Just ((Text "Natural too big: " :<>: ShowType x) :$$: (Text "Required: <=" :<>: ShowType n)))
type Check (NatGE n :: TyFun Nat (Maybe ErrorMessage) -> Type) (x :: Nat) Source # 
Instance details

Defined in Data.Type.BitRecords.Assert

type Check (NatGE n :: TyFun Nat (Maybe ErrorMessage) -> Type) (x :: Nat) = If (n <=? x) (Nothing :: Maybe ErrorMessage) (Just ((Text "Natural too small: " :<>: ShowType x) :$$: (Text "Required: >=" :<>: ShowType n)))
type Apply (ListlengthSym0 :: TyFun [a] Nat -> Type) (a6989586621680404185 :: [a]) 
Instance details

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

type Apply (ListlengthSym0 :: TyFun [a] Nat -> Type) (a6989586621680404185 :: [a]) = Listlength a6989586621680404185
type Apply (LengthSym0 :: TyFun [a] Nat -> Type) (a6989586621679948578 :: [a]) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (LengthSym0 :: TyFun [a] Nat -> Type) (a6989586621679948578 :: [a]) = Length a6989586621679948578
type Apply (FromEnum_6989586621680881926Sym0 :: TyFun (Min a) Nat -> Type) (a6989586621680881925 :: Min a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (FromEnum_6989586621680881926Sym0 :: TyFun (Min a) Nat -> Type) (a6989586621680881925 :: Min a) = FromEnum_6989586621680881926 a6989586621680881925
type Apply (FromEnum_6989586621680882225Sym0 :: TyFun (Max a) Nat -> Type) (a6989586621680882224 :: Max a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (FromEnum_6989586621680882225Sym0 :: TyFun (Max a) Nat -> Type) (a6989586621680882224 :: Max a) = FromEnum_6989586621680882225 a6989586621680882224
type Apply (FromEnum_6989586621680882750Sym0 :: TyFun (First a) Nat -> Type) (a6989586621680882749 :: First a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (FromEnum_6989586621680882750Sym0 :: TyFun (First a) Nat -> Type) (a6989586621680882749 :: First a) = FromEnum_6989586621680882750 a6989586621680882749
type Apply (FromEnum_6989586621680882978Sym0 :: TyFun (Last a) Nat -> Type) (a6989586621680882977 :: Last a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (FromEnum_6989586621680882978Sym0 :: TyFun (Last a) Nat -> Type) (a6989586621680882977 :: Last a) = FromEnum_6989586621680882978 a6989586621680882977
type Apply (FromEnum_6989586621680883162Sym0 :: TyFun (WrappedMonoid a) Nat -> Type) (a6989586621680883161 :: WrappedMonoid a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (FromEnum_6989586621680883162Sym0 :: TyFun (WrappedMonoid a) Nat -> Type) (a6989586621680883161 :: WrappedMonoid a) = FromEnum_6989586621680883162 a6989586621680883161
type Apply (FromEnum_6989586621680675513Sym0 :: TyFun (Identity a) Nat -> Type) (a6989586621680675512 :: Identity a) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type Apply (FromEnum_6989586621680675513Sym0 :: TyFun (Identity a) Nat -> Type) (a6989586621680675512 :: Identity a) = FromEnum_6989586621680675513 a6989586621680675512
type Apply (Length_6989586621680675796Sym0 :: TyFun (Identity a) Nat -> Type) (a6989586621680675795 :: Identity a) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type Apply (Length_6989586621680675796Sym0 :: TyFun (Identity a) Nat -> Type) (a6989586621680675795 :: Identity a) = Length_6989586621680675796 a6989586621680675795
type Apply (Length_6989586621680451478Sym0 :: TyFun (t a) Nat -> Type) (a6989586621680451477 :: t a) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Length_6989586621680451478Sym0 :: TyFun (t a) Nat -> Type) (a6989586621680451477 :: t a) = Length_6989586621680451478 a6989586621680451477
type Apply (Length_6989586621680451229Sym0 :: TyFun (t a) Nat -> Type) (a6989586621680451228 :: t a) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Length_6989586621680451229Sym0 :: TyFun (t a) Nat -> Type) (a6989586621680451228 :: t a) = Length_6989586621680451229 a6989586621680451228
type Apply (LengthSym0 :: TyFun (t a) Nat -> Type) (arg6989586621680450983 :: t a) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (LengthSym0 :: TyFun (t a) Nat -> Type) (arg6989586621680450983 :: t a) = Length arg6989586621680450983
type Apply (Length_6989586621680451672Sym0 :: TyFun (t a) Nat -> Type) (a6989586621680451671 :: t a) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Length_6989586621680451672Sym0 :: TyFun (t a) Nat -> Type) (a6989586621680451671 :: t a) = Length_6989586621680451672 a6989586621680451671
type Apply (Length_6989586621680451807Sym0 :: TyFun (t a) Nat -> Type) (a6989586621680451806 :: t a) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Length_6989586621680451807Sym0 :: TyFun (t a) Nat -> Type) (a6989586621680451806 :: t a) = Length_6989586621680451807 a6989586621680451806
type Apply (Length_6989586621680451974Sym0 :: TyFun (t a) Nat -> Type) (a6989586621680451973 :: t a) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Length_6989586621680451974Sym0 :: TyFun (t a) Nat -> Type) (a6989586621680451973 :: t a) = Length_6989586621680451974 a6989586621680451973
type Apply (Length_6989586621680452141Sym0 :: TyFun (t a) Nat -> Type) (a6989586621680452140 :: t a) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Length_6989586621680452141Sym0 :: TyFun (t a) Nat -> Type) (a6989586621680452140 :: t a) = Length_6989586621680452141 a6989586621680452140
type Check (NatIn from to :: TyFun Nat (Maybe ErrorMessage) -> Type) (n :: Nat) Source # 
Instance details

Defined in Data.Type.BitRecords.Assert

type Check (NatIn from to :: TyFun Nat (Maybe ErrorMessage) -> Type) (n :: Nat)
type Apply (FromEnum_6989586621680711027Sym0 :: TyFun (Const a b) Nat -> Type) (a6989586621680711026 :: Const a b) 
Instance details

Defined in Data.Singletons.Prelude.Const

type Apply (FromEnum_6989586621680711027Sym0 :: TyFun (Const a b) Nat -> Type) (a6989586621680711026 :: Const a b) = FromEnum_6989586621680711027 a6989586621680711026
type Apply (EftNatSym1 a6989586621679739714 :: TyFun Nat [Nat] -> Type) (a6989586621679739715 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Enum

type Apply (EftNatSym1 a6989586621679739714 :: TyFun Nat [Nat] -> Type) (a6989586621679739715 :: Nat) = EftNat a6989586621679739714 a6989586621679739715
type Apply (ToEnum_6989586621680881919Sym0 :: TyFun Nat (Min a6989586621680881171) -> Type) (a6989586621680881918 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ToEnum_6989586621680881919Sym0 :: TyFun Nat (Min a6989586621680881171) -> Type) (a6989586621680881918 :: Nat) = (ToEnum_6989586621680881919 a6989586621680881918 :: Min a6989586621680881171)
type Apply (FromInteger_6989586621680882094Sym0 :: TyFun Nat (Min a6989586621680881186) -> Type) (a6989586621680882093 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (FromInteger_6989586621680882094Sym0 :: TyFun Nat (Min a6989586621680881186) -> Type) (a6989586621680882093 :: Nat) = (FromInteger_6989586621680882094 a6989586621680882093 :: Min a6989586621680881186)
type Apply (ToEnum_6989586621680882218Sym0 :: TyFun Nat (Max a6989586621680881203) -> Type) (a6989586621680882217 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ToEnum_6989586621680882218Sym0 :: TyFun Nat (Max a6989586621680881203) -> Type) (a6989586621680882217 :: Nat) = (ToEnum_6989586621680882218 a6989586621680882217 :: Max a6989586621680881203)
type Apply (FromInteger_6989586621680882393Sym0 :: TyFun Nat (Max a6989586621680881218) -> Type) (a6989586621680882392 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (FromInteger_6989586621680882393Sym0 :: TyFun Nat (Max a6989586621680881218) -> Type) (a6989586621680882392 :: Nat) = (FromInteger_6989586621680882393 a6989586621680882392 :: Max a6989586621680881218)
type Apply (ToEnum_6989586621680882743Sym0 :: TyFun Nat (First a6989586621680881257) -> Type) (a6989586621680882742 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ToEnum_6989586621680882743Sym0 :: TyFun Nat (First a6989586621680881257) -> Type) (a6989586621680882742 :: Nat) = (ToEnum_6989586621680882743 a6989586621680882742 :: First a6989586621680881257)
type Apply (ToEnum_6989586621680882971Sym0 :: TyFun Nat (Last a6989586621680881278) -> Type) (a6989586621680882970 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ToEnum_6989586621680882971Sym0 :: TyFun Nat (Last a6989586621680881278) -> Type) (a6989586621680882970 :: Nat) = (ToEnum_6989586621680882971 a6989586621680882970 :: Last a6989586621680881278)
type Apply (ToEnum_6989586621680883155Sym0 :: TyFun Nat (WrappedMonoid a6989586621680881295) -> Type) (a6989586621680883154 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ToEnum_6989586621680883155Sym0 :: TyFun Nat (WrappedMonoid a6989586621680881295) -> Type) (a6989586621680883154 :: Nat) = (ToEnum_6989586621680883155 a6989586621680883154 :: WrappedMonoid a6989586621680881295)
type Apply (ToEnum_6989586621680675506Sym0 :: TyFun Nat (Identity a6989586621680675102) -> Type) (a6989586621680675505 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type Apply (ToEnum_6989586621680675506Sym0 :: TyFun Nat (Identity a6989586621680675102) -> Type) (a6989586621680675505 :: Nat) = (ToEnum_6989586621680675506 a6989586621680675505 :: Identity a6989586621680675102)
type Apply (FromInteger_6989586621680675608Sym0 :: TyFun Nat (Identity a6989586621680675113) -> Type) (a6989586621680675607 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type Apply (FromInteger_6989586621680675608Sym0 :: TyFun Nat (Identity a6989586621680675113) -> Type) (a6989586621680675607 :: Nat) = (FromInteger_6989586621680675608 a6989586621680675607 :: Identity a6989586621680675113)
type Apply (FromInteger_6989586621679837944Sym0 :: TyFun Nat (Sum a6989586621679837584) -> Type) (a6989586621679837943 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (FromInteger_6989586621679837944Sym0 :: TyFun Nat (Sum a6989586621679837584) -> Type) (a6989586621679837943 :: Nat) = (FromInteger_6989586621679837944 a6989586621679837943 :: Sum a6989586621679837584)
type Apply (FromInteger_6989586621679838084Sym0 :: TyFun Nat (Product a6989586621679837602) -> Type) (a6989586621679838083 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (FromInteger_6989586621679838084Sym0 :: TyFun Nat (Product a6989586621679837602) -> Type) (a6989586621679838083 :: Nat) = (FromInteger_6989586621679838084 a6989586621679838083 :: Product a6989586621679837602)
type Apply (EfdtNatDnSym2 a6989586621679739583 a6989586621679739582 :: TyFun Nat [Nat] -> Type) (a6989586621679739584 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Enum

type Apply (EfdtNatDnSym2 a6989586621679739583 a6989586621679739582 :: TyFun Nat [Nat] -> Type) (a6989586621679739584 :: Nat) = EfdtNatDn a6989586621679739583 a6989586621679739582 a6989586621679739584
type Apply (EfdtNatSym2 a6989586621679739697 a6989586621679739696 :: TyFun Nat [Nat] -> Type) (a6989586621679739698 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Enum

type Apply (EfdtNatSym2 a6989586621679739697 a6989586621679739696 :: TyFun Nat [Nat] -> Type) (a6989586621679739698 :: Nat) = EfdtNat a6989586621679739697 a6989586621679739696 a6989586621679739698
type Apply (EfdtNatUpSym2 a6989586621679739640 a6989586621679739639 :: TyFun Nat [Nat] -> Type) (a6989586621679739641 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Enum

type Apply (EfdtNatUpSym2 a6989586621679739640 a6989586621679739639 :: TyFun Nat [Nat] -> Type) (a6989586621679739641 :: Nat) = EfdtNatUp a6989586621679739640 a6989586621679739639 a6989586621679739641
type Apply (FindIndicesSym1 a6989586621679949175 :: TyFun [a] [Nat] -> Type) (a6989586621679949176 :: [a]) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (FindIndicesSym1 a6989586621679949175 :: TyFun [a] [Nat] -> Type) (a6989586621679949176 :: [a]) = FindIndices a6989586621679949175 a6989586621679949176
type Apply (ElemIndicesSym1 a6989586621679949201 :: TyFun [a] [Nat] -> Type) (a6989586621679949202 :: [a]) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (ElemIndicesSym1 a6989586621679949201 :: TyFun [a] [Nat] -> Type) (a6989586621679949202 :: [a]) = ElemIndices a6989586621679949201 a6989586621679949202
type Apply (FindIndexSym1 a6989586621679949209 :: TyFun [a] (Maybe Nat) -> Type) (a6989586621679949210 :: [a]) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (FindIndexSym1 a6989586621679949209 :: TyFun [a] (Maybe Nat) -> Type) (a6989586621679949210 :: [a]) = FindIndex a6989586621679949209 a6989586621679949210
type Apply (ElemIndexSym1 a6989586621679949217 :: TyFun [a] (Maybe Nat) -> Type) (a6989586621679949218 :: [a]) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (ElemIndexSym1 a6989586621679949217 :: TyFun [a] (Maybe Nat) -> Type) (a6989586621679949218 :: [a]) = ElemIndex a6989586621679949217 a6989586621679949218
type Apply (Let6989586621679949181BuildListSym3 a6989586621679949182 xs6989586621679949180 p6989586621679949179 b6989586621679939741 :: TyFun [b6989586621679939741] [Nat] -> Type) (a6989586621679949183 :: [b6989586621679939741]) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (Let6989586621679949181BuildListSym3 a6989586621679949182 xs6989586621679949180 p6989586621679949179 b6989586621679939741 :: TyFun [b6989586621679939741] [Nat] -> Type) (a6989586621679949183 :: [b6989586621679939741]) = Let6989586621679949181BuildList a6989586621679949182 xs6989586621679949180 p6989586621679949179 a6989586621679949183
type ToBitStringBuilder (Proxy (MkField MkFieldU8)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

type ToBitStringBuilder (Proxy (MkField MkFieldU16)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

type ToBitStringBuilder (Proxy (MkField MkFieldU32)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

type ToBitStringBuilder (Proxy (MkField MkFieldU64)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

type ToBitStringBuilder (Proxy (f := v)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

type ToBitStringBuilder (Proxy (f := v)) a = a
type ToBitStringBuilder (Proxy (MkField (MkFieldBits :: BitField (B s) Nat s))) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

type ToBitStringBuilder (Proxy (MkField (MkFieldBits :: BitField (B s) Nat s))) a = B s -> a
type Apply ShowsPrec_6989586621680280557Sym0 (a6989586621680280554 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply ShowsPrec_6989586621680280557Sym0 (a6989586621680280554 :: Nat) = ShowsPrec_6989586621680280557Sym1 a6989586621680280554
type Apply ShowsPrec_6989586621680280584Sym0 (a6989586621680280581 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply ShowsPrec_6989586621680280584Sym0 (a6989586621680280581 :: Nat) = ShowsPrec_6989586621680280584Sym1 a6989586621680280581
type Apply (<=?@#@$) (a3530822107858468865 :: Nat) 
Instance details

Defined in Data.Singletons.TypeLits.Internal

type Apply (<=?@#@$) (a3530822107858468865 :: Nat) = (<=?@#@$$) a3530822107858468865
type Apply EftNatSym0 (a6989586621679739714 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Enum

type Apply EftNatSym0 (a6989586621679739714 :: Nat) = EftNatSym1 a6989586621679739714
type Apply RemSym0 (a6989586621679486524 :: Nat) 
Instance details

Defined in Data.Singletons.TypeLits

type Apply RemSym0 (a6989586621679486524 :: Nat) = RemSym1 a6989586621679486524
type Apply QuotSym0 (a6989586621679486534 :: Nat) 
Instance details

Defined in Data.Singletons.TypeLits

type Apply QuotSym0 (a6989586621679486534 :: Nat) = QuotSym1 a6989586621679486534
type Apply ModSym0 (a3530822107858468865 :: Nat) 
Instance details

Defined in Data.Singletons.TypeLits

type Apply ModSym0 (a3530822107858468865 :: Nat) = ModSym1 a3530822107858468865
type Apply DivSym0 (a3530822107858468865 :: Nat) 
Instance details

Defined in Data.Singletons.TypeLits

type Apply DivSym0 (a3530822107858468865 :: Nat) = DivSym1 a3530822107858468865
type Apply (^@#@$) (a3530822107858468865 :: Nat) 
Instance details

Defined in Data.Singletons.TypeLits.Internal

type Apply (^@#@$) (a3530822107858468865 :: Nat) = (^@#@$$) a3530822107858468865
type Apply DivModSym0 (a6989586621679486540 :: Nat) 
Instance details

Defined in Data.Singletons.TypeLits

type Apply DivModSym0 (a6989586621679486540 :: Nat) = DivModSym1 a6989586621679486540
type Apply QuotRemSym0 (a6989586621679486550 :: Nat) 
Instance details

Defined in Data.Singletons.TypeLits

type Apply QuotRemSym0 (a6989586621679486550 :: Nat) = QuotRemSym1 a6989586621679486550
type Apply EfdtNatDnSym0 (a6989586621679739582 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Enum

type Apply EfdtNatDnSym0 (a6989586621679739582 :: Nat) = EfdtNatDnSym1 a6989586621679739582
type Apply EfdtNatSym0 (a6989586621679739696 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Enum

type Apply EfdtNatSym0 (a6989586621679739696 :: Nat) = EfdtNatSym1 a6989586621679739696
type Apply EfdtNatUpSym0 (a6989586621679739639 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Enum

type Apply EfdtNatUpSym0 (a6989586621679739639 :: Nat) = EfdtNatUpSym1 a6989586621679739639
type Apply ShowsNatSym0 (a6989586621680279794 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply ShowsNatSym0 (a6989586621680279794 :: Nat) = ShowsNatSym1 a6989586621680279794
type Apply ShowsPrec_6989586621680262357Sym0 (a6989586621680262354 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply ShowsPrec_6989586621680262357Sym0 (a6989586621680262354 :: Nat) = ShowsPrec_6989586621680262357Sym1 a6989586621680262354
type Apply ShowsPrec_6989586621680280406Sym0 (a6989586621680280403 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply ShowsPrec_6989586621680280406Sym0 (a6989586621680280403 :: Nat) = ShowsPrec_6989586621680280406Sym1 a6989586621680280403
type Apply ShowsPrec_6989586621680280612Sym0 (a6989586621680280609 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply ShowsPrec_6989586621680280612Sym0 (a6989586621680280609 :: Nat) = ShowsPrec_6989586621680280612Sym1 a6989586621680280609
type Apply ShowsPrec_6989586621680865201Sym0 (a6989586621680865198 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply ShowsPrec_6989586621680865201Sym0 (a6989586621680865198 :: Nat) = ShowsPrec_6989586621680865201Sym1 a6989586621680865198
type Apply ShowsPrec_6989586621680865227Sym0 (a6989586621680865224 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply ShowsPrec_6989586621680865227Sym0 (a6989586621680865224 :: Nat) = ShowsPrec_6989586621680865227Sym1 a6989586621680865224
type Apply (DivModSym1 a6989586621679486540 :: TyFun Nat (Nat, Nat) -> Type) (a6989586621679486541 :: Nat) 
Instance details

Defined in Data.Singletons.TypeLits

type Apply (DivModSym1 a6989586621679486540 :: TyFun Nat (Nat, Nat) -> Type) (a6989586621679486541 :: Nat) = DivMod a6989586621679486540 a6989586621679486541
type Apply (QuotRemSym1 a6989586621679486550 :: TyFun Nat (Nat, Nat) -> Type) (a6989586621679486551 :: Nat) 
Instance details

Defined in Data.Singletons.TypeLits

type Apply (QuotRemSym1 a6989586621679486550 :: TyFun Nat (Nat, Nat) -> Type) (a6989586621679486551 :: Nat) = QuotRem a6989586621679486550 a6989586621679486551
type Apply (ShowsPrec_6989586621680262337Sym0 :: TyFun Nat ([a6989586621680260343] ~> (Symbol ~> Symbol)) -> Type) (a6989586621680262334 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680262337Sym0 :: TyFun Nat ([a6989586621680260343] ~> (Symbol ~> Symbol)) -> Type) (a6989586621680262334 :: Nat) = (ShowsPrec_6989586621680262337Sym1 a6989586621680262334 a6989586621680260343 :: TyFun [a6989586621680260343] (Symbol ~> Symbol) -> Type)
type Apply (ListsplitAtSym0 :: TyFun Nat ([a6989586621680404053] ~> ([a6989586621680404053], [a6989586621680404053])) -> Type) (a6989586621680404202 :: Nat) 
Instance details

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

type Apply (ListsplitAtSym0 :: TyFun Nat ([a6989586621680404053] ~> ([a6989586621680404053], [a6989586621680404053])) -> Type) (a6989586621680404202 :: Nat) = (ListsplitAtSym1 a6989586621680404202 a6989586621680404053 :: TyFun [a6989586621680404053] ([a6989586621680404053], [a6989586621680404053]) -> Type)
type Apply (ListdropSym0 :: TyFun Nat ([a6989586621680404054] ~> [a6989586621680404054]) -> Type) (a6989586621680404212 :: Nat) 
Instance details

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

type Apply (ListdropSym0 :: TyFun Nat ([a6989586621680404054] ~> [a6989586621680404054]) -> Type) (a6989586621680404212 :: Nat) = (ListdropSym1 a6989586621680404212 a6989586621680404054 :: TyFun [a6989586621680404054] [a6989586621680404054] -> Type)
type Apply (ListtakeSym0 :: TyFun Nat ([a6989586621680404055] ~> [a6989586621680404055]) -> Type) (a6989586621680404222 :: Nat) 
Instance details

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

type Apply (ListtakeSym0 :: TyFun Nat ([a6989586621680404055] ~> [a6989586621680404055]) -> Type) (a6989586621680404222 :: Nat) = (ListtakeSym1 a6989586621680404222 a6989586621680404055 :: TyFun [a6989586621680404055] [a6989586621680404055] -> Type)
type Apply (DropSym0 :: TyFun Nat ([a6989586621679939279] ~> [a6989586621679939279]) -> Type) (a6989586621679948648 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (DropSym0 :: TyFun Nat ([a6989586621679939279] ~> [a6989586621679939279]) -> Type) (a6989586621679948648 :: Nat) = (DropSym1 a6989586621679948648 a6989586621679939279 :: TyFun [a6989586621679939279] [a6989586621679939279] -> Type)
type Apply (TakeSym0 :: TyFun Nat ([a6989586621679939280] ~> [a6989586621679939280]) -> Type) (a6989586621679948662 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (TakeSym0 :: TyFun Nat ([a6989586621679939280] ~> [a6989586621679939280]) -> Type) (a6989586621679948662 :: Nat) = (TakeSym1 a6989586621679948662 a6989586621679939280 :: TyFun [a6989586621679939280] [a6989586621679939280] -> Type)
type Apply (SplitAtSym0 :: TyFun Nat ([a6989586621679939278] ~> ([a6989586621679939278], [a6989586621679939278])) -> Type) (a6989586621679948676 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (SplitAtSym0 :: TyFun Nat ([a6989586621679939278] ~> ([a6989586621679939278], [a6989586621679939278])) -> Type) (a6989586621679948676 :: Nat) = (SplitAtSym1 a6989586621679948676 a6989586621679939278 :: TyFun [a6989586621679939278] ([a6989586621679939278], [a6989586621679939278]) -> Type)
type Apply (ElemIndicesSym0 :: TyFun a6989586621679939290 ([a6989586621679939290] ~> [Nat]) -> Type) (a6989586621679949201 :: a6989586621679939290) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (ElemIndicesSym0 :: TyFun a6989586621679939290 ([a6989586621679939290] ~> [Nat]) -> Type) (a6989586621679949201 :: a6989586621679939290) = ElemIndicesSym1 a6989586621679949201
type Apply (ElemIndexSym0 :: TyFun a6989586621679939291 ([a6989586621679939291] ~> Maybe Nat) -> Type) (a6989586621679949217 :: a6989586621679939291) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (ElemIndexSym0 :: TyFun a6989586621679939291 ([a6989586621679939291] ~> Maybe Nat) -> Type) (a6989586621679949217 :: a6989586621679939291) = ElemIndexSym1 a6989586621679949217
type Apply (ShowsPrec_6989586621680280443Sym0 :: TyFun Nat (Maybe a3530822107858468865 ~> (Symbol ~> Symbol)) -> Type) (a6989586621680280440 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680280443Sym0 :: TyFun Nat (Maybe a3530822107858468865 ~> (Symbol ~> Symbol)) -> Type) (a6989586621680280440 :: Nat) = (ShowsPrec_6989586621680280443Sym1 a6989586621680280440 a3530822107858468865 :: TyFun (Maybe a3530822107858468865) (Symbol ~> Symbol) -> Type)
type Apply (EfdtNatDnSym1 a6989586621679739582 :: TyFun Nat (Nat ~> [Nat]) -> Type) (a6989586621679739583 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Enum

type Apply (EfdtNatDnSym1 a6989586621679739582 :: TyFun Nat (Nat ~> [Nat]) -> Type) (a6989586621679739583 :: Nat) = EfdtNatDnSym2 a6989586621679739582 a6989586621679739583
type Apply (EfdtNatSym1 a6989586621679739696 :: TyFun Nat (Nat ~> [Nat]) -> Type) (a6989586621679739697 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Enum

type Apply (EfdtNatSym1 a6989586621679739696 :: TyFun Nat (Nat ~> [Nat]) -> Type) (a6989586621679739697 :: Nat) = EfdtNatSym2 a6989586621679739696 a6989586621679739697
type Apply (EfdtNatUpSym1 a6989586621679739639 :: TyFun Nat (Nat ~> [Nat]) -> Type) (a6989586621679739640 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Enum

type Apply (EfdtNatUpSym1 a6989586621679739639 :: TyFun Nat (Nat ~> [Nat]) -> Type) (a6989586621679739640 :: Nat) = EfdtNatUpSym2 a6989586621679739639 a6989586621679739640
type Apply (ShowsPrec_6989586621680262298Sym0 :: TyFun Nat (a6989586621680260325 ~> (Symbol ~> Symbol)) -> Type) (a6989586621680262295 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680262298Sym0 :: TyFun Nat (a6989586621680260325 ~> (Symbol ~> Symbol)) -> Type) (a6989586621680262295 :: Nat) = (ShowsPrec_6989586621680262298Sym1 a6989586621680262295 a6989586621680260325 :: TyFun a6989586621680260325 (Symbol ~> Symbol) -> Type)
type Apply (ShowsPrecSym0 :: TyFun Nat (a6989586621680260325 ~> (Symbol ~> Symbol)) -> Type) (arg6989586621680262275 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrecSym0 :: TyFun Nat (a6989586621680260325 ~> (Symbol ~> Symbol)) -> Type) (arg6989586621680262275 :: Nat) = (ShowsPrecSym1 arg6989586621680262275 a6989586621680260325 :: TyFun a6989586621680260325 (Symbol ~> Symbol) -> Type)
type Apply (ReplicateSym0 :: TyFun Nat (a6989586621679939264 ~> [a6989586621679939264]) -> Type) (a6989586621679948566 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (ReplicateSym0 :: TyFun Nat (a6989586621679939264 ~> [a6989586621679939264]) -> Type) (a6989586621679948566 :: Nat) = (ReplicateSym1 a6989586621679948566 a6989586621679939264 :: TyFun a6989586621679939264 [a6989586621679939264] -> Type)
type Apply (ShowsPrec_6989586621680865314Sym0 :: TyFun Nat (Min a6989586621679050961 ~> (Symbol ~> Symbol)) -> Type) (a6989586621680865311 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ShowsPrec_6989586621680865314Sym0 :: TyFun Nat (Min a6989586621679050961 ~> (Symbol ~> Symbol)) -> Type) (a6989586621680865311 :: Nat) = (ShowsPrec_6989586621680865314Sym1 a6989586621680865311 a6989586621679050961 :: TyFun (Min a6989586621679050961) (Symbol ~> Symbol) -> Type)
type Apply (ShowsPrec_6989586621680865343Sym0 :: TyFun Nat (Max a6989586621679050967 ~> (Symbol ~> Symbol)) -> Type) (a6989586621680865340 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ShowsPrec_6989586621680865343Sym0 :: TyFun Nat (Max a6989586621679050967 ~> (Symbol ~> Symbol)) -> Type) (a6989586621680865340 :: Nat) = (ShowsPrec_6989586621680865343Sym1 a6989586621680865340 a6989586621679050967 :: TyFun (Max a6989586621679050967) (Symbol ~> Symbol) -> Type)
type Apply (ShowsPrec_6989586621680865372Sym0 :: TyFun Nat (First a6989586621679050981 ~> (Symbol ~> Symbol)) -> Type) (a6989586621680865369 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ShowsPrec_6989586621680865372Sym0 :: TyFun Nat (First a6989586621679050981 ~> (Symbol ~> Symbol)) -> Type) (a6989586621680865369 :: Nat) = (ShowsPrec_6989586621680865372Sym1 a6989586621680865369 a6989586621679050981 :: TyFun (First a6989586621679050981) (Symbol ~> Symbol) -> Type)
type Apply (ShowsPrec_6989586621680865401Sym0 :: TyFun Nat (Last a6989586621679050987 ~> (Symbol ~> Symbol)) -> Type) (a6989586621680865398 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ShowsPrec_6989586621680865401Sym0 :: TyFun Nat (Last a6989586621679050987 ~> (Symbol ~> Symbol)) -> Type) (a6989586621680865398 :: Nat) = (ShowsPrec_6989586621680865401Sym1 a6989586621680865398 a6989586621679050987 :: TyFun (Last a6989586621679050987) (Symbol ~> Symbol) -> Type)
type Apply (ShowsPrec_6989586621680865430Sym0 :: TyFun Nat (WrappedMonoid m6989586621679050993 ~> (Symbol ~> Symbol)) -> Type) (a6989586621680865427 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ShowsPrec_6989586621680865430Sym0 :: TyFun Nat (WrappedMonoid m6989586621679050993 ~> (Symbol ~> Symbol)) -> Type) (a6989586621680865427 :: Nat) = (ShowsPrec_6989586621680865430Sym1 a6989586621680865427 m6989586621679050993 :: TyFun (WrappedMonoid m6989586621679050993) (Symbol ~> Symbol) -> Type)
type Apply (ShowsPrec_6989586621680865146Sym0 :: TyFun Nat (Option a6989586621679050999 ~> (Symbol ~> Symbol)) -> Type) (a6989586621680865143 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ShowsPrec_6989586621680865146Sym0 :: TyFun Nat (Option a6989586621679050999 ~> (Symbol ~> Symbol)) -> Type) (a6989586621680865143 :: Nat) = (ShowsPrec_6989586621680865146Sym1 a6989586621680865143 a6989586621679050999 :: TyFun (Option a6989586621679050999) (Symbol ~> Symbol) -> Type)
type Apply (ShowsPrec_6989586621680675637Sym0 :: TyFun Nat (Identity a6989586621680675127 ~> (Symbol ~> Symbol)) -> Type) (a6989586621680675634 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type Apply (ShowsPrec_6989586621680675637Sym0 :: TyFun Nat (Identity a6989586621680675127 ~> (Symbol ~> Symbol)) -> Type) (a6989586621680675634 :: Nat) = (ShowsPrec_6989586621680675637Sym1 a6989586621680675634 a6989586621680675127 :: TyFun (Identity a6989586621680675127) (Symbol ~> Symbol) -> Type)
type Apply (ShowsPrec_6989586621680335234Sym0 :: TyFun Nat (First a6989586621679072624 ~> (Symbol ~> Symbol)) -> Type) (a6989586621680335231 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (ShowsPrec_6989586621680335234Sym0 :: TyFun Nat (First a6989586621679072624 ~> (Symbol ~> Symbol)) -> Type) (a6989586621680335231 :: Nat) = (ShowsPrec_6989586621680335234Sym1 a6989586621680335231 a6989586621679072624 :: TyFun (First a6989586621679072624) (Symbol ~> Symbol) -> Type)
type Apply (ShowsPrec_6989586621680335263Sym0 :: TyFun Nat (Last a6989586621679072619 ~> (Symbol ~> Symbol)) -> Type) (a6989586621680335260 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (ShowsPrec_6989586621680335263Sym0 :: TyFun Nat (Last a6989586621679072619 ~> (Symbol ~> Symbol)) -> Type) (a6989586621680335260 :: Nat) = (ShowsPrec_6989586621680335263Sym1 a6989586621680335260 a6989586621679072619 :: TyFun (Last a6989586621679072619) (Symbol ~> Symbol) -> Type)
type Apply (ShowsPrec_6989586621680865175Sym0 :: TyFun Nat (Dual a6989586621679072595 ~> (Symbol ~> Symbol)) -> Type) (a6989586621680865172 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ShowsPrec_6989586621680865175Sym0 :: TyFun Nat (Dual a6989586621679072595 ~> (Symbol ~> Symbol)) -> Type) (a6989586621680865172 :: Nat) = (ShowsPrec_6989586621680865175Sym1 a6989586621680865172 a6989586621679072595 :: TyFun (Dual a6989586621679072595) (Symbol ~> Symbol) -> Type)
type Apply (ShowsPrec_6989586621680865256Sym0 :: TyFun Nat (Sum a6989586621679072580 ~> (Symbol ~> Symbol)) -> Type) (a6989586621680865253 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ShowsPrec_6989586621680865256Sym0 :: TyFun Nat (Sum a6989586621679072580 ~> (Symbol ~> Symbol)) -> Type) (a6989586621680865253 :: Nat) = (ShowsPrec_6989586621680865256Sym1 a6989586621680865253 a6989586621679072580 :: TyFun (Sum a6989586621679072580) (Symbol ~> Symbol) -> Type)
type Apply (ShowsPrec_6989586621680865285Sym0 :: TyFun Nat (Product a6989586621679072585 ~> (Symbol ~> Symbol)) -> Type) (a6989586621680865282 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ShowsPrec_6989586621680865285Sym0 :: TyFun Nat (Product a6989586621679072585 ~> (Symbol ~> Symbol)) -> Type) (a6989586621680865282 :: Nat) = (ShowsPrec_6989586621680865285Sym1 a6989586621680865282 a6989586621679072585 :: TyFun (Product a6989586621679072585) (Symbol ~> Symbol) -> Type)
type Apply (ShowsPrec_6989586621680280531Sym0 :: TyFun Nat (NonEmpty a6989586621679055391 ~> (Symbol ~> Symbol)) -> Type) (a6989586621680280528 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680280531Sym0 :: TyFun Nat (NonEmpty a6989586621679055391 ~> (Symbol ~> Symbol)) -> Type) (a6989586621680280528 :: Nat) = (ShowsPrec_6989586621680280531Sym1 a6989586621680280528 a6989586621679055391 :: TyFun (NonEmpty a6989586621679055391) (Symbol ~> Symbol) -> Type)
type Apply (ShowsPrec_6989586621680280497Sym0 :: TyFun Nat (Either a6989586621679073691 b6989586621679073692 ~> (Symbol ~> Symbol)) -> Type) (a6989586621680280494 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680280497Sym0 :: TyFun Nat (Either a6989586621679073691 b6989586621679073692 ~> (Symbol ~> Symbol)) -> Type) (a6989586621680280494 :: Nat) = (ShowsPrec_6989586621680280497Sym1 a6989586621680280494 a6989586621679073691 b6989586621679073692 :: TyFun (Either a6989586621679073691 b6989586621679073692) (Symbol ~> Symbol) -> Type)
type Apply (ShowsPrec_6989586621680262374Sym0 :: TyFun Nat ((a6989586621680260347, b6989586621680260348) ~> (Symbol ~> Symbol)) -> Type) (a6989586621680262371 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680262374Sym0 :: TyFun Nat ((a6989586621680260347, b6989586621680260348) ~> (Symbol ~> Symbol)) -> Type) (a6989586621680262371 :: Nat) = (ShowsPrec_6989586621680262374Sym1 a6989586621680262371 a6989586621680260347 b6989586621680260348 :: TyFun (a6989586621680260347, b6989586621680260348) (Symbol ~> Symbol) -> Type)
type Apply (ShowsPrec_6989586621680882596Sym0 :: TyFun Nat (Arg a6989586621680881245 b6989586621680881246 ~> (Symbol ~> Symbol)) -> Type) (a6989586621680882593 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ShowsPrec_6989586621680882596Sym0 :: TyFun Nat (Arg a6989586621680881245 b6989586621680881246 ~> (Symbol ~> Symbol)) -> Type) (a6989586621680882593 :: Nat) = (ShowsPrec_6989586621680882596Sym1 a6989586621680882593 a6989586621680881245 b6989586621680881246 :: TyFun (Arg a6989586621680881245 b6989586621680881246) (Symbol ~> Symbol) -> Type)
type Apply (Let6989586621679949181BuildListSym0 :: TyFun k1 (TyFun k2 (TyFun Nat ([b6989586621679939741] ~> [Nat]) -> Type) -> Type) -> Type) (p6989586621679949179 :: k1) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (Let6989586621679949181BuildListSym0 :: TyFun k1 (TyFun k2 (TyFun Nat ([b6989586621679939741] ~> [Nat]) -> Type) -> Type) -> Type) (p6989586621679949179 :: k1) = (Let6989586621679949181BuildListSym1 p6989586621679949179 :: TyFun k2 (TyFun Nat ([b6989586621679939741] ~> [Nat]) -> Type) -> Type)
type Apply (ShowsPrec_6989586621680262392Sym0 :: TyFun Nat ((a6989586621680260352, b6989586621680260353, c6989586621680260354) ~> (Symbol ~> Symbol)) -> Type) (a6989586621680262389 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680262392Sym0 :: TyFun Nat ((a6989586621680260352, b6989586621680260353, c6989586621680260354) ~> (Symbol ~> Symbol)) -> Type) (a6989586621680262389 :: Nat) = (ShowsPrec_6989586621680262392Sym1 a6989586621680262389 a6989586621680260352 b6989586621680260353 c6989586621680260354 :: TyFun (a6989586621680260352, b6989586621680260353, c6989586621680260354) (Symbol ~> Symbol) -> Type)
type Apply (ShowsPrec_6989586621680711151Sym0 :: TyFun Nat (Const a6989586621680710532 b6989586621680710533 ~> (Symbol ~> Symbol)) -> Type) (a6989586621680711148 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Const

type Apply (ShowsPrec_6989586621680711151Sym0 :: TyFun Nat (Const a6989586621680710532 b6989586621680710533 ~> (Symbol ~> Symbol)) -> Type) (a6989586621680711148 :: Nat) = (ShowsPrec_6989586621680711151Sym1 a6989586621680711148 a6989586621680710532 b6989586621680710533 :: TyFun (Const a6989586621680710532 b6989586621680710533) (Symbol ~> Symbol) -> Type)
type Apply (Let6989586621679949181BuildListSym1 p6989586621679949179 :: TyFun k1 (TyFun Nat ([b6989586621679939741] ~> [Nat]) -> Type) -> Type) (xs6989586621679949180 :: k1) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (Let6989586621679949181BuildListSym1 p6989586621679949179 :: TyFun k1 (TyFun Nat ([b6989586621679939741] ~> [Nat]) -> Type) -> Type) (xs6989586621679949180 :: k1) = (Let6989586621679949181BuildListSym2 p6989586621679949179 xs6989586621679949180 b6989586621679939741 :: TyFun Nat ([b6989586621679939741] ~> [Nat]) -> Type)
type Apply (ShowsPrec_6989586621680262411Sym0 :: TyFun Nat ((a6989586621680260359, b6989586621680260360, c6989586621680260361, d6989586621680260362) ~> (Symbol ~> Symbol)) -> Type) (a6989586621680262408 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680262411Sym0 :: TyFun Nat ((a6989586621680260359, b6989586621680260360, c6989586621680260361, d6989586621680260362) ~> (Symbol ~> Symbol)) -> Type) (a6989586621680262408 :: Nat) = (ShowsPrec_6989586621680262411Sym1 a6989586621680262408 a6989586621680260359 b6989586621680260360 c6989586621680260361 d6989586621680260362 :: TyFun (a6989586621680260359, b6989586621680260360, c6989586621680260361, d6989586621680260362) (Symbol ~> Symbol) -> Type)
type Apply (Let6989586621679949181BuildListSym2 xs6989586621679949180 p6989586621679949179 b6989586621679939741 :: TyFun Nat ([b6989586621679939741] ~> [Nat]) -> Type) (a6989586621679949182 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (Let6989586621679949181BuildListSym2 xs6989586621679949180 p6989586621679949179 b6989586621679939741 :: TyFun Nat ([b6989586621679939741] ~> [Nat]) -> Type) (a6989586621679949182 :: Nat) = (Let6989586621679949181BuildListSym3 xs6989586621679949180 p6989586621679949179 a6989586621679949182 b6989586621679939741 :: TyFun [b6989586621679939741] [Nat] -> Type)
type Apply (ShowsPrec_6989586621680262431Sym0 :: TyFun Nat ((a6989586621680260368, b6989586621680260369, c6989586621680260370, d6989586621680260371, e6989586621680260372) ~> (Symbol ~> Symbol)) -> Type) (a6989586621680262428 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680262431Sym0 :: TyFun Nat ((a6989586621680260368, b6989586621680260369, c6989586621680260370, d6989586621680260371, e6989586621680260372) ~> (Symbol ~> Symbol)) -> Type) (a6989586621680262428 :: Nat) = (ShowsPrec_6989586621680262431Sym1 a6989586621680262428 a6989586621680260368 b6989586621680260369 c6989586621680260370 d6989586621680260371 e6989586621680260372 :: TyFun (a6989586621680260368, b6989586621680260369, c6989586621680260370, d6989586621680260371, e6989586621680260372) (Symbol ~> Symbol) -> Type)
type Apply (ShowsPrec_6989586621680262452Sym0 :: TyFun Nat ((a6989586621680260379, b6989586621680260380, c6989586621680260381, d6989586621680260382, e6989586621680260383, f6989586621680260384) ~> (Symbol ~> Symbol)) -> Type) (a6989586621680262449 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680262452Sym0 :: TyFun Nat ((a6989586621680260379, b6989586621680260380, c6989586621680260381, d6989586621680260382, e6989586621680260383, f6989586621680260384) ~> (Symbol ~> Symbol)) -> Type) (a6989586621680262449 :: Nat) = (ShowsPrec_6989586621680262452Sym1 a6989586621680262449 a6989586621680260379 b6989586621680260380 c6989586621680260381 d6989586621680260382 e6989586621680260383 f6989586621680260384 :: TyFun (a6989586621680260379, b6989586621680260380, c6989586621680260381, d6989586621680260382, e6989586621680260383, f6989586621680260384) (Symbol ~> Symbol) -> Type)
type Apply (ShowsPrec_6989586621680262474Sym0 :: TyFun Nat ((a6989586621680260392, b6989586621680260393, c6989586621680260394, d6989586621680260395, e6989586621680260396, f6989586621680260397, g6989586621680260398) ~> (Symbol ~> Symbol)) -> Type) (a6989586621680262471 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680262474Sym0 :: TyFun Nat ((a6989586621680260392, b6989586621680260393, c6989586621680260394, d6989586621680260395, e6989586621680260396, f6989586621680260397, g6989586621680260398) ~> (Symbol ~> Symbol)) -> Type) (a6989586621680262471 :: Nat) = (ShowsPrec_6989586621680262474Sym1 a6989586621680262471 a6989586621680260392 b6989586621680260393 c6989586621680260394 d6989586621680260395 e6989586621680260396 f6989586621680260397 g6989586621680260398 :: TyFun (a6989586621680260392, b6989586621680260393, c6989586621680260394, d6989586621680260395, e6989586621680260396, f6989586621680260397, g6989586621680260398) (Symbol ~> Symbol) -> Type)
type Apply (ListindexSym0 :: TyFun [a6989586621680404052] (Nat ~> a6989586621680404052) -> Type) (a6989586621680404192 :: [a6989586621680404052]) 
Instance details

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

type Apply (ListindexSym0 :: TyFun [a6989586621680404052] (Nat ~> a6989586621680404052) -> Type) (a6989586621680404192 :: [a6989586621680404052]) = ListindexSym1 a6989586621680404192
type Apply ((!!@#@$) :: TyFun [a6989586621679939262] (Nat ~> a6989586621679939262) -> Type) (a6989586621679948552 :: [a6989586621679939262]) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply ((!!@#@$) :: TyFun [a6989586621679939262] (Nat ~> a6989586621679939262) -> Type) (a6989586621679948552 :: [a6989586621679939262]) = (!!@#@$$) a6989586621679948552
type Apply (FindIndicesSym0 :: TyFun (a6989586621679939288 ~> Bool) ([a6989586621679939288] ~> [Nat]) -> Type) (a6989586621679949175 :: a6989586621679939288 ~> Bool) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (FindIndicesSym0 :: TyFun (a6989586621679939288 ~> Bool) ([a6989586621679939288] ~> [Nat]) -> Type) (a6989586621679949175 :: a6989586621679939288 ~> Bool) = FindIndicesSym1 a6989586621679949175
type Apply (FindIndexSym0 :: TyFun (a6989586621679939289 ~> Bool) ([a6989586621679939289] ~> Maybe Nat) -> Type) (a6989586621679949209 :: a6989586621679939289 ~> Bool) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (FindIndexSym0 :: TyFun (a6989586621679939289 ~> Bool) ([a6989586621679939289] ~> Maybe Nat) -> Type) (a6989586621679949209 :: a6989586621679939289 ~> Bool) = FindIndexSym1 a6989586621679949209
type Apply (ToEnum_6989586621680711020Sym0 :: TyFun Nat (Const a6989586621680710503 b6989586621680710504) -> Type) (a6989586621680711019 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Const

type Apply (ToEnum_6989586621680711020Sym0 :: TyFun Nat (Const a6989586621680710503 b6989586621680710504) -> Type) (a6989586621680711019 :: Nat) = (ToEnum_6989586621680711020 a6989586621680711019 :: Const a6989586621680710503 b6989586621680710504)
type Apply (FromInteger_6989586621680711122Sym0 :: TyFun Nat (Const a6989586621680710516 b6989586621680710517) -> Type) (a6989586621680711121 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Const

type Apply (FromInteger_6989586621680711122Sym0 :: TyFun Nat (Const a6989586621680710516 b6989586621680710517) -> Type) (a6989586621680711121 :: Nat) = (FromInteger_6989586621680711122 a6989586621680711121 :: Const a6989586621680710516 b6989586621680710517)

data Symbol #

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

Instances
SingKind Symbol

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Associated Types

type DemoteRep Symbol :: Type

Methods

fromSing :: Sing a -> DemoteRep Symbol

PIsString Symbol 
Instance details

Defined in Data.Singletons.Prelude.IsString

Associated Types

type FromString arg :: a #

SIsString Symbol 
Instance details

Defined in Data.Singletons.Prelude.IsString

PMonoid Symbol 
Instance details

Defined in Data.Singletons.Prelude.Monoid

Associated Types

type Mempty :: a #

type Mappend arg arg1 :: a #

type Mconcat arg :: a #

SMonoid Symbol 
Instance details

Defined in Data.Singletons.Prelude.Monoid

PShow Symbol 
Instance details

Defined in Data.Singletons.Prelude.Show

Associated Types

type ShowsPrec arg arg1 arg2 :: Symbol #

type Show_ arg :: Symbol #

type ShowList arg arg1 :: Symbol #

SShow Symbol 
Instance details

Defined in Data.Singletons.Prelude.Show

Methods

sShowsPrec :: Sing t1 -> Sing t2 -> Sing t3 -> Sing (Apply (Apply (Apply ShowsPrecSym0 t1) t2) t3) #

sShow_ :: Sing t -> Sing (Apply Show_Sym0 t) #

sShowList :: Sing t1 -> Sing t2 -> Sing (Apply (Apply ShowListSym0 t1) t2) #

PSemigroup Symbol 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

Associated Types

type arg <> arg1 :: a #

type Sconcat arg :: a #

SSemigroup Symbol 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

Methods

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

sSconcat :: Sing t -> Sing (Apply SconcatSym0 t) #

IsBox ChunkOffsetTable64 Source # 
Instance details

Defined in Data.ByteString.IsoBaseFileFormat.Boxes.ChunkOffset

Associated Types

type BoxContent ChunkOffsetTable64 :: Type Source #

IsBox ChunkOffsetTable32 Source # 
Instance details

Defined in Data.ByteString.IsoBaseFileFormat.Boxes.ChunkOffset

Associated Types

type BoxContent ChunkOffsetTable32 :: Type Source #

KnownSymbol a => SingI (a :: Symbol)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

sing :: Sing a

KnownSymbol str => FromTypeLit Text (str :: Symbol) Source # 
Instance details

Defined in Data.ByteString.IsoBaseFileFormat.Util.BoxFields

Methods

fromTypeLit :: proxy Text str -> Text Source #

KnownSymbol str => FromTypeLit (U32Text label) (str :: Symbol) Source # 
Instance details

Defined in Data.ByteString.IsoBaseFileFormat.Util.BoxFields

Methods

fromTypeLit :: proxy (U32Text label) str -> U32Text label Source #

(KnownSymbol label, SingI arr, Num o, SingKind [Nat], KnownNat len, len ~ Length arr) => FromTypeLit (ScalarArray label len o) (arr :: [Nat]) Source # 
Instance details

Defined in Data.ByteString.IsoBaseFileFormat.Util.BoxFields

Methods

fromTypeLit :: proxy (ScalarArray label len o) arr -> ScalarArray label len o Source #

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

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings ShowsPrec_6989586621680280584Sym0 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings ShowsNatSym0 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings ShowsPrec_6989586621680262357Sym0 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings ShowsPrec_6989586621680280406Sym0 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings ShowsPrec_6989586621680280612Sym0 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings ShowsPrec_6989586621680865201Sym0 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings ShowsPrec_6989586621680865227Sym0 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings KnownSymbolSym0 
Instance details

Defined in Data.Singletons.TypeLits

SuppressUnusedWarnings ShowSpaceSym0 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings ShowCommaSpaceSym0 
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 ShowSpaceSym0 
Instance details

Defined in Data.Singletons.Prelude.Show

SingI ShowCommaSpaceSym0 
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

SuppressUnusedWarnings (ShowsPrec_6989586621680280557Sym1 a6989586621680280554 :: TyFun Bool (Symbol ~> Symbol) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (ShowList_6989586621680262318Sym0 :: TyFun [a6989586621680260325] (Symbol ~> Symbol) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

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

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (ShowsPrec_6989586621680280584Sym1 a6989586621680280581 :: TyFun Ordering (Symbol ~> Symbol) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (ShowsPrec_6989586621680262337Sym0 :: TyFun Nat ([a6989586621680260343] ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

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

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (ShowsPrec_6989586621680262298Sym0 :: TyFun Nat (a6989586621680260325 ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

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

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (ShowsPrec_6989586621680865314Sym0 :: TyFun Nat (Min a6989586621679050961 ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (ShowsPrec_6989586621680865343Sym0 :: TyFun Nat (Max a6989586621679050967 ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (ShowsPrec_6989586621680865372Sym0 :: TyFun Nat (First a6989586621679050981 ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (ShowsPrec_6989586621680865401Sym0 :: TyFun Nat (Last a6989586621679050987 ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (ShowsPrec_6989586621680865430Sym0 :: TyFun Nat (WrappedMonoid m6989586621679050993 ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (ShowsPrec_6989586621680865146Sym0 :: TyFun Nat (Option a6989586621679050999 ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (ShowsPrec_6989586621680675637Sym0 :: TyFun Nat (Identity a6989586621680675127 ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Identity

SuppressUnusedWarnings (ShowsPrec_6989586621680335234Sym0 :: TyFun Nat (First a6989586621679072624 ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

SuppressUnusedWarnings (ShowsPrec_6989586621680335263Sym0 :: TyFun Nat (Last a6989586621679072619 ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

SuppressUnusedWarnings (ShowsPrec_6989586621680865175Sym0 :: TyFun Nat (Dual a6989586621679072595 ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (ShowsPrec_6989586621680865256Sym0 :: TyFun Nat (Sum a6989586621679072580 ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (ShowsPrec_6989586621680865285Sym0 :: TyFun Nat (Product a6989586621679072585 ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (ShowsPrec_6989586621680280531Sym0 :: TyFun Nat (NonEmpty a6989586621679055391 ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (Fail_6989586621679607690Sym0 :: TyFun Symbol [a6989586621679544294] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

SuppressUnusedWarnings (Fail_6989586621679607625Sym0 :: TyFun Symbol (Maybe a6989586621679544294) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

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

Defined in Data.Singletons.Prelude.Show

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

Defined in Data.Singletons.Prelude.Show

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

Defined in Data.Singletons.Prelude.Show

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

Defined in Data.Singletons.Prelude.Show

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

Defined in Data.Singletons.Prelude.IsString

SuppressUnusedWarnings (FromString_6989586621681196299Sym0 :: TyFun Symbol (Identity a6989586621681196255) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.IsString

SuppressUnusedWarnings (ShowsPrec_6989586621680262357Sym1 a6989586621680262354 :: TyFun Symbol (Symbol ~> Symbol) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (ShowsPrec_6989586621680280406Sym1 a6989586621680280403 :: TyFun () (Symbol ~> Symbol) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

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

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (Show__6989586621680262307Sym0 :: TyFun a6989586621680260325 Symbol -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

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

Defined in Data.Singletons.Prelude.Show

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

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (ShowsPrec_6989586621680280612Sym1 a6989586621680280609 :: TyFun Void (Symbol ~> Symbol) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (ShowsPrec_6989586621680865201Sym1 a6989586621680865198 :: TyFun All (Symbol ~> Symbol) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (ShowsPrec_6989586621680865227Sym1 a6989586621680865224 :: TyFun Any (Symbol ~> Symbol) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

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

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (ShowListWithSym0 :: TyFun (a6989586621680260309 ~> (Symbol ~> Symbol)) ([a6989586621680260309] ~> (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

SuppressUnusedWarnings (ShowsPrec_6989586621680262337Sym1 a6989586621680262334 a6989586621680260343 :: TyFun [a6989586621680260343] (Symbol ~> Symbol) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (ShowListWithSym1 a6989586621680262247 :: TyFun [a6989586621680260309] (Symbol ~> Symbol) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (ShowsPrec_6989586621680280443Sym1 a6989586621680280440 a3530822107858468865 :: TyFun (Maybe a3530822107858468865) (Symbol ~> Symbol) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (ShowsPrec_6989586621680280497Sym0 :: TyFun Nat (Either a6989586621679073691 b6989586621679073692 ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (ShowsPrec_6989586621680262374Sym0 :: TyFun Nat ((a6989586621680260347, b6989586621680260348) ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (ShowsPrec_6989586621680882596Sym0 :: TyFun Nat (Arg a6989586621680881245 b6989586621680881246 ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (ShowParenSym2 a6989586621680262216 a6989586621680262215 :: TyFun Symbol Symbol -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

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

Defined in Data.Singletons.Prelude.Show

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

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (ShowList_6989586621680262318Sym1 a6989586621680262316 :: TyFun Symbol Symbol -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (ShowsPrec_6989586621680262357Sym2 a6989586621680262355 a6989586621680262354 :: TyFun Symbol Symbol -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (ShowsPrec_6989586621680280406Sym2 a6989586621680280404 a6989586621680280403 :: TyFun Symbol Symbol -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (ShowsPrec_6989586621680280557Sym2 a6989586621680280555 a6989586621680280554 :: TyFun Symbol Symbol -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (ShowsPrec_6989586621680280584Sym2 a6989586621680280582 a6989586621680280581 :: TyFun Symbol Symbol -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (ShowsPrec_6989586621680280612Sym2 a6989586621680280610 a6989586621680280609 :: TyFun Symbol Symbol -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (ShowsPrec_6989586621680865201Sym2 a6989586621680865199 a6989586621680865198 :: TyFun Symbol Symbol -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (ShowsPrec_6989586621680865227Sym2 a6989586621680865225 a6989586621680865224 :: TyFun Symbol Symbol -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (Lambda_6989586621680262184Sym1 a_69895866216802621796989586621680262183 :: TyFun Symbol Symbol -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (ShowsPrec_6989586621680262298Sym1 a6989586621680262295 a6989586621680260325 :: TyFun a6989586621680260325 (Symbol ~> Symbol) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (ShowsPrecSym1 arg6989586621680262275 a6989586621680260325 :: TyFun a6989586621680260325 (Symbol ~> Symbol) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

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

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (ShowsPrec_6989586621680865314Sym1 a6989586621680865311 a6989586621679050961 :: TyFun (Min a6989586621679050961) (Symbol ~> Symbol) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (ShowsPrec_6989586621680865343Sym1 a6989586621680865340 a6989586621679050967 :: TyFun (Max a6989586621679050967) (Symbol ~> Symbol) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (ShowsPrec_6989586621680865372Sym1 a6989586621680865369 a6989586621679050981 :: TyFun (First a6989586621679050981) (Symbol ~> Symbol) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (ShowsPrec_6989586621680865401Sym1 a6989586621680865398 a6989586621679050987 :: TyFun (Last a6989586621679050987) (Symbol ~> Symbol) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (ShowsPrec_6989586621680865430Sym1 a6989586621680865427 m6989586621679050993 :: TyFun (WrappedMonoid m6989586621679050993) (Symbol ~> Symbol) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (ShowsPrec_6989586621680865146Sym1 a6989586621680865143 a6989586621679050999 :: TyFun (Option a6989586621679050999) (Symbol ~> Symbol) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (ShowsPrec_6989586621680675637Sym1 a6989586621680675634 a6989586621680675127 :: TyFun (Identity a6989586621680675127) (Symbol ~> Symbol) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Identity

SuppressUnusedWarnings (ShowsPrec_6989586621680335234Sym1 a6989586621680335231 a6989586621679072624 :: TyFun (First a6989586621679072624) (Symbol ~> Symbol) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

SuppressUnusedWarnings (ShowsPrec_6989586621680335263Sym1 a6989586621680335260 a6989586621679072619 :: TyFun (Last a6989586621679072619) (Symbol ~> Symbol) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

SuppressUnusedWarnings (ShowsPrec_6989586621680865175Sym1 a6989586621680865172 a6989586621679072595 :: TyFun (Dual a6989586621679072595) (Symbol ~> Symbol) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (ShowsPrec_6989586621680865256Sym1 a6989586621680865253 a6989586621679072580 :: TyFun (Sum a6989586621679072580) (Symbol ~> Symbol) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (ShowsPrec_6989586621680865285Sym1 a6989586621680865282 a6989586621679072585 :: TyFun (Product a6989586621679072585) (Symbol ~> Symbol) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (ShowsPrec_6989586621680280531Sym1 a6989586621680280528 a6989586621679055391 :: TyFun (NonEmpty a6989586621679055391) (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) #

SuppressUnusedWarnings (ShowsPrec_6989586621680280497Sym1 a6989586621680280494 a6989586621679073691 b6989586621679073692 :: TyFun (Either a6989586621679073691 b6989586621679073692) (Symbol ~> Symbol) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (ShowsPrec_6989586621680262392Sym0 :: TyFun Nat ((a6989586621680260352, b6989586621680260353, c6989586621680260354) ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (ShowsPrec_6989586621680711151Sym0 :: TyFun Nat (Const a6989586621680710532 b6989586621680710533 ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Const

SuppressUnusedWarnings (ShowListWithSym2 a6989586621680262248 a6989586621680262247 :: TyFun Symbol Symbol -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (ShowsPrecSym2 arg6989586621680262276 arg6989586621680262275 :: TyFun Symbol Symbol -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (ShowsPrec_6989586621680675637Sym2 a6989586621680675635 a6989586621680675634 :: TyFun Symbol Symbol -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Identity

SuppressUnusedWarnings (ShowsPrec_6989586621680335234Sym2 a6989586621680335232 a6989586621680335231 :: TyFun Symbol Symbol -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

SuppressUnusedWarnings (ShowsPrec_6989586621680335263Sym2 a6989586621680335261 a6989586621680335260 :: TyFun Symbol Symbol -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

SuppressUnusedWarnings (ShowsPrec_6989586621680262298Sym2 a6989586621680262296 a6989586621680262295 :: TyFun Symbol Symbol -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (ShowsPrec_6989586621680262337Sym2 a6989586621680262335 a6989586621680262334 :: TyFun Symbol Symbol -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (ShowsPrec_6989586621680280443Sym2 a6989586621680280441 a6989586621680280440 :: TyFun Symbol Symbol -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (ShowsPrec_6989586621680280531Sym2 a6989586621680280529 a6989586621680280528 :: TyFun Symbol Symbol -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (ShowsPrec_6989586621680865146Sym2 a6989586621680865144 a6989586621680865143 :: TyFun Symbol Symbol -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (ShowsPrec_6989586621680865175Sym2 a6989586621680865173 a6989586621680865172 :: TyFun Symbol Symbol -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (ShowsPrec_6989586621680865256Sym2 a6989586621680865254 a6989586621680865253 :: TyFun Symbol Symbol -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (ShowsPrec_6989586621680865285Sym2 a6989586621680865283 a6989586621680865282 :: TyFun Symbol Symbol -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (ShowsPrec_6989586621680865314Sym2 a6989586621680865312 a6989586621680865311 :: TyFun Symbol Symbol -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (ShowsPrec_6989586621680865343Sym2 a6989586621680865341 a6989586621680865340 :: TyFun Symbol Symbol -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (ShowsPrec_6989586621680865372Sym2 a6989586621680865370 a6989586621680865369 :: TyFun Symbol Symbol -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (ShowsPrec_6989586621680865401Sym2 a6989586621680865399 a6989586621680865398 :: TyFun Symbol Symbol -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (ShowsPrec_6989586621680865430Sym2 a6989586621680865428 a6989586621680865427 :: TyFun Symbol Symbol -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (Fail_6989586621679544807Sym0 :: TyFun Symbol (m6989586621679544288 a6989586621679544294) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

SuppressUnusedWarnings (FailSym0 :: TyFun Symbol (m6989586621679544288 a6989586621679544294) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

SuppressUnusedWarnings (FromString_6989586621681196292Sym0 :: TyFun Symbol (Const a6989586621681196252 b6989586621681196253) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.IsString

SuppressUnusedWarnings (ShowsPrec_6989586621680262374Sym1 a6989586621680262371 a6989586621680260347 b6989586621680260348 :: TyFun (a6989586621680260347, b6989586621680260348) (Symbol ~> Symbol) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (Let6989586621679948974GoSym1 w6989586621679948972 :: TyFun k1 (TyFun [Symbol] Symbol -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (ShowsPrec_6989586621680882596Sym1 a6989586621680882593 a6989586621680881245 b6989586621680881246 :: TyFun (Arg a6989586621680881245 b6989586621680881246) (Symbol ~> Symbol) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (Let6989586621680262258ShowlSym0 :: TyFun (k3 ~> (Symbol ~> Symbol)) (TyFun k1 (TyFun k2 (TyFun Symbol (TyFun [k3] 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) #

SMonad m => SingI (FailSym0 :: TyFun Symbol (m a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

Methods

sing :: Sing FailSym0 #

SuppressUnusedWarnings (Let6989586621679948974GoSym2 ws6989586621679948973 w6989586621679948972 :: TyFun [Symbol] Symbol -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (ShowsPrec_6989586621680262411Sym0 :: TyFun Nat ((a6989586621680260359, b6989586621680260360, c6989586621680260361, d6989586621680260362) ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (ShowsPrec_6989586621680262374Sym2 a6989586621680262372 a6989586621680262371 :: TyFun Symbol Symbol -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (ShowsPrec_6989586621680280497Sym2 a6989586621680280495 a6989586621680280494 :: TyFun Symbol Symbol -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (ShowsPrec_6989586621680882596Sym2 a6989586621680882594 a6989586621680882593 :: TyFun Symbol Symbol -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (ShowsPrec_6989586621680262392Sym1 a6989586621680262389 a6989586621680260352 b6989586621680260353 c6989586621680260354 :: TyFun (a6989586621680260352, b6989586621680260353, c6989586621680260354) (Symbol ~> Symbol) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

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

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (Lambda_6989586621680262237Sym0 :: TyFun k1 (TyFun k2 (TyFun (Symbol ~> c6989586621679519978) (TyFun (a6989586621679519979 ~> Symbol) (TyFun a6989586621679519979 c6989586621679519978 -> Type) -> Type) -> Type) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (ShowsPrec_6989586621680711151Sym1 a6989586621680711148 a6989586621680710532 b6989586621680710533 :: TyFun (Const a6989586621680710532 b6989586621680710533) (Symbol ~> Symbol) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Const

SuppressUnusedWarnings (ShowsPrec_6989586621680262431Sym0 :: TyFun Nat ((a6989586621680260368, b6989586621680260369, c6989586621680260370, d6989586621680260371, e6989586621680260372) ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (ShowsPrec_6989586621680711151Sym2 a6989586621680711149 a6989586621680711148 :: TyFun Symbol Symbol -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Const

SuppressUnusedWarnings (ShowsPrec_6989586621680262392Sym2 a6989586621680262390 a6989586621680262389 :: TyFun Symbol Symbol -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (ShowsPrec_6989586621680262411Sym1 a6989586621680262408 a6989586621680260359 b6989586621680260360 c6989586621680260361 d6989586621680260362 :: TyFun (a6989586621680260359, b6989586621680260360, c6989586621680260361, d6989586621680260362) (Symbol ~> Symbol) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (Let6989586621680262258ShowlSym2 x6989586621680262255 showx6989586621680262254 :: TyFun k1 (TyFun Symbol (TyFun [k3] Symbol -> Type) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (Lambda_6989586621680262237Sym1 ss6989586621680262235 :: TyFun k1 (TyFun (Symbol ~> c6989586621679519978) (TyFun (a6989586621679519979 ~> Symbol) (TyFun a6989586621679519979 c6989586621679519978 -> Type) -> Type) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (ShowsPrec_6989586621680262452Sym0 :: TyFun Nat ((a6989586621680260379, b6989586621680260380, c6989586621680260381, d6989586621680260382, e6989586621680260383, f6989586621680260384) ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (Let6989586621680262258ShowlSym3 xs6989586621680262256 x6989586621680262255 showx6989586621680262254 :: TyFun Symbol (TyFun [k3] Symbol -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (ShowsPrec_6989586621680262411Sym2 a6989586621680262409 a6989586621680262408 :: TyFun Symbol Symbol -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (ShowsPrec_6989586621680262431Sym1 a6989586621680262428 a6989586621680260368 b6989586621680260369 c6989586621680260370 d6989586621680260371 e6989586621680260372 :: TyFun (a6989586621680260368, b6989586621680260369, c6989586621680260370, d6989586621680260371, e6989586621680260372) (Symbol ~> Symbol) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (Lambda_6989586621680262237Sym2 a_69895866216802622336989586621680262236 ss6989586621680262235 :: TyFun (Symbol ~> c6989586621679519978) (TyFun (a6989586621679519979 ~> Symbol) (TyFun a6989586621679519979 c6989586621679519978 -> Type) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (Let6989586621680262258ShowlSym4 s6989586621680262257 xs6989586621680262256 x6989586621680262255 showx6989586621680262254 :: TyFun [k3] Symbol -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (ShowsPrec_6989586621680262474Sym0 :: TyFun Nat ((a6989586621680260392, b6989586621680260393, c6989586621680260394, d6989586621680260395, e6989586621680260396, f6989586621680260397, g6989586621680260398) ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (ShowsPrec_6989586621680262431Sym2 a6989586621680262429 a6989586621680262428 :: TyFun Symbol Symbol -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (ShowsPrec_6989586621680262452Sym1 a6989586621680262449 a6989586621680260379 b6989586621680260380 c6989586621680260381 d6989586621680260382 e6989586621680260383 f6989586621680260384 :: TyFun (a6989586621680260379, b6989586621680260380, c6989586621680260381, d6989586621680260382, e6989586621680260383, f6989586621680260384) (Symbol ~> Symbol) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (Lambda_6989586621680262237Sym3 t6989586621680262241 a_69895866216802622336989586621680262236 ss6989586621680262235 :: TyFun (a6989586621679519979 ~> Symbol) (TyFun a6989586621679519979 c6989586621679519978 -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (ShowsPrec_6989586621680262452Sym2 a6989586621680262450 a6989586621680262449 :: TyFun Symbol Symbol -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (ShowsPrec_6989586621680262474Sym1 a6989586621680262471 a6989586621680260392 b6989586621680260393 c6989586621680260394 d6989586621680260395 e6989586621680260396 f6989586621680260397 g6989586621680260398 :: TyFun (a6989586621680260392, b6989586621680260393, c6989586621680260394, d6989586621680260395, e6989586621680260396, f6989586621680260397, g6989586621680260398) (Symbol ~> Symbol) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (ShowsPrec_6989586621680262474Sym2 a6989586621680262472 a6989586621680262471 :: TyFun Symbol Symbol -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

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 Data.Singletons.Prelude.Monoid

type Mempty = (Mempty_6989586621680328861Sym0 :: Symbol)
data Sing (n :: Symbol) 
Instance details

Defined in Data.Singletons.TypeLits.Internal

data Sing (n :: Symbol) where
type Demote Symbol 
Instance details

Defined in Data.Singletons.TypeLits.Internal

type BoxContent ChunkOffsetTable64 Source # 
Instance details

Defined in Data.ByteString.IsoBaseFileFormat.Boxes.ChunkOffset

type BoxContent ChunkOffsetTable32 Source # 
Instance details

Defined in Data.ByteString.IsoBaseFileFormat.Boxes.ChunkOffset

type ToPretty (t :: Symbol)

A type of kind Symbol is translated to PutStr.

Since: pretty-types-0.2.1.0

Instance details

Defined in Data.Type.Pretty

type ToPretty (t :: Symbol) = PutStr t
type FromString a 
Instance details

Defined in Data.Singletons.Prelude.IsString

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

Defined in Data.Singletons.Prelude.Monoid

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

Defined in Data.Singletons.Prelude.Show

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

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Sconcat (arg :: NonEmpty Symbol) = Apply (Sconcat_6989586621679810578Sym0 :: TyFun (NonEmpty Symbol) Symbol -> Type) arg
type Mappend (arg1 :: Symbol) (arg2 :: Symbol) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Mappend (arg1 :: Symbol) (arg2 :: Symbol) = Apply (Apply (Mappend_6989586621680328798Sym0 :: 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_6989586621680262318Sym0 :: 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_6989586621679379811Sym0 :: 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_6989586621679379793Sym0 :: 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_6989586621679379775Sym0 :: 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_6989586621679379757Sym0 :: 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_6989586621679379739Sym0 :: 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_6989586621679379721Sym0 :: 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_6989586621680262357Sym0 a1) a2) a3
type Apply KnownSymbolSym0 (n6989586621679466984 :: Symbol) 
Instance details

Defined in Data.Singletons.TypeLits

type Apply KnownSymbolSym0 (n6989586621679466984 :: Symbol) = KnownSymbol n6989586621679466984
type Apply ShowSpaceSym0 (a6989586621680262181 :: Symbol) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply ShowSpaceSym0 (a6989586621680262181 :: Symbol) = ShowSpace a6989586621680262181
type Apply ShowCommaSpaceSym0 (a6989586621680262202 :: Symbol) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply ShowCommaSpaceSym0 (a6989586621680262202 :: Symbol) = ShowCommaSpace a6989586621680262202
type Apply (ShowStringSym1 a6989586621680262194 :: TyFun Symbol Symbol -> Type) (a6989586621680262195 :: Symbol) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowStringSym1 a6989586621680262194 :: TyFun Symbol Symbol -> Type) (a6989586621680262195 :: Symbol) = ShowString a6989586621680262194 a6989586621680262195
type Apply (ShowCharSym1 a6989586621680262209 :: TyFun Symbol Symbol -> Type) (a6989586621680262210 :: Symbol) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowCharSym1 a6989586621680262209 :: TyFun Symbol Symbol -> Type) (a6989586621680262210 :: Symbol) = ShowChar a6989586621680262209 a6989586621680262210
type Apply (Show_tupleSym1 a6989586621680262229 :: TyFun Symbol Symbol -> Type) (a6989586621680262230 :: Symbol) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (Show_tupleSym1 a6989586621680262229 :: TyFun Symbol Symbol -> Type) (a6989586621680262230 :: Symbol) = Show_tuple a6989586621680262229 a6989586621680262230
type Apply (ShowsNatSym1 a6989586621680279794 :: TyFun Symbol Symbol -> Type) (a6989586621680279795 :: Symbol) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsNatSym1 a6989586621680279794 :: TyFun Symbol Symbol -> Type) (a6989586621680279795 :: Symbol) = ShowsNat a6989586621680279794 a6989586621680279795
type Apply (Show__6989586621680262307Sym0 :: TyFun a Symbol -> Type) (a6989586621680262306 :: a) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (Show__6989586621680262307Sym0 :: TyFun a Symbol -> Type) (a6989586621680262306 :: a) = Show__6989586621680262307 a6989586621680262306
type Apply (Show_Sym0 :: TyFun a Symbol -> Type) (arg6989586621680262281 :: a) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (Show_Sym0 :: TyFun a Symbol -> Type) (arg6989586621680262281 :: a) = Show_ arg6989586621680262281
type Apply (FromStringSym0 :: TyFun Symbol k2 -> Type) (arg6989586621681196286 :: Symbol) 
Instance details

Defined in Data.Singletons.Prelude.IsString

type Apply (FromStringSym0 :: TyFun Symbol k2 -> Type) (arg6989586621681196286 :: Symbol) = (FromString arg6989586621681196286 :: k2)
type Apply (ShowParenSym2 a6989586621680262216 a6989586621680262215 :: TyFun Symbol Symbol -> Type) (a6989586621680262217 :: Symbol) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowParenSym2 a6989586621680262216 a6989586621680262215 :: TyFun Symbol Symbol -> Type) (a6989586621680262217 :: Symbol) = ShowParen a6989586621680262216 a6989586621680262215 a6989586621680262217
type Apply (ShowsSym1 a6989586621680262267 :: TyFun Symbol Symbol -> Type) (a6989586621680262268 :: Symbol) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsSym1 a6989586621680262267 :: TyFun Symbol Symbol -> Type) (a6989586621680262268 :: Symbol) = Shows a6989586621680262267 a6989586621680262268
type Apply (ShowListSym1 arg6989586621680262283 :: TyFun Symbol Symbol -> Type) (arg6989586621680262284 :: Symbol) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowListSym1 arg6989586621680262283 :: TyFun Symbol Symbol -> Type) (arg6989586621680262284 :: Symbol) = ShowList arg6989586621680262283 arg6989586621680262284
type Apply (Lambda_6989586621680262184Sym1 a_69895866216802621796989586621680262183 :: TyFun Symbol Symbol -> Type) (t6989586621680262187 :: Symbol) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (Lambda_6989586621680262184Sym1 a_69895866216802621796989586621680262183 :: TyFun Symbol Symbol -> Type) (t6989586621680262187 :: Symbol) = Lambda_6989586621680262184 a_69895866216802621796989586621680262183 t6989586621680262187
type Apply (ShowList_6989586621680262318Sym1 a6989586621680262316 :: TyFun Symbol Symbol -> Type) (a6989586621680262317 :: Symbol) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowList_6989586621680262318Sym1 a6989586621680262316 :: TyFun Symbol Symbol -> Type) (a6989586621680262317 :: Symbol) = ShowList_6989586621680262318 a6989586621680262316 a6989586621680262317
type Apply (ShowsPrec_6989586621680262357Sym2 a6989586621680262355 a6989586621680262354 :: TyFun Symbol Symbol -> Type) (a6989586621680262356 :: Symbol) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680262357Sym2 a6989586621680262355 a6989586621680262354 :: TyFun Symbol Symbol -> Type) (a6989586621680262356 :: Symbol) = ShowsPrec_6989586621680262357 a6989586621680262355 a6989586621680262354 a6989586621680262356
type Apply (ShowsPrec_6989586621680280406Sym2 a6989586621680280404 a6989586621680280403 :: TyFun Symbol Symbol -> Type) (a6989586621680280405 :: Symbol) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680280406Sym2 a6989586621680280404 a6989586621680280403 :: TyFun Symbol Symbol -> Type) (a6989586621680280405 :: Symbol) = ShowsPrec_6989586621680280406 a6989586621680280404 a6989586621680280403 a6989586621680280405
type Apply (ShowsPrec_6989586621680280557Sym2 a6989586621680280555 a6989586621680280554 :: TyFun Symbol Symbol -> Type) (a6989586621680280556 :: Symbol) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680280557Sym2 a6989586621680280555 a6989586621680280554 :: TyFun Symbol Symbol -> Type) (a6989586621680280556 :: Symbol) = ShowsPrec_6989586621680280557 a6989586621680280555 a6989586621680280554 a6989586621680280556
type Apply (ShowsPrec_6989586621680280584Sym2 a6989586621680280582 a6989586621680280581 :: TyFun Symbol Symbol -> Type) (a6989586621680280583 :: Symbol) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680280584Sym2 a6989586621680280582 a6989586621680280581 :: TyFun Symbol Symbol -> Type) (a6989586621680280583 :: Symbol) = ShowsPrec_6989586621680280584 a6989586621680280582 a6989586621680280581 a6989586621680280583
type Apply (ShowsPrec_6989586621680280612Sym2 a6989586621680280610 a6989586621680280609 :: TyFun Symbol Symbol -> Type) (a6989586621680280611 :: Symbol) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680280612Sym2 a6989586621680280610 a6989586621680280609 :: TyFun Symbol Symbol -> Type) (a6989586621680280611 :: Symbol) = ShowsPrec_6989586621680280612 a6989586621680280610 a6989586621680280609 a6989586621680280611
type Apply (ShowsPrec_6989586621680865201Sym2 a6989586621680865199 a6989586621680865198 :: TyFun Symbol Symbol -> Type) (a6989586621680865200 :: Symbol) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ShowsPrec_6989586621680865201Sym2 a6989586621680865199 a6989586621680865198 :: TyFun Symbol Symbol -> Type) (a6989586621680865200 :: Symbol) = ShowsPrec_6989586621680865201 a6989586621680865199 a6989586621680865198 a6989586621680865200
type Apply (ShowsPrec_6989586621680865227Sym2 a6989586621680865225 a6989586621680865224 :: TyFun Symbol Symbol -> Type) (a6989586621680865226 :: Symbol) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ShowsPrec_6989586621680865227Sym2 a6989586621680865225 a6989586621680865224 :: TyFun Symbol Symbol -> Type) (a6989586621680865226 :: Symbol) = ShowsPrec_6989586621680865227 a6989586621680865225 a6989586621680865224 a6989586621680865226
type Apply (ShowListWithSym2 a6989586621680262248 a6989586621680262247 :: TyFun Symbol Symbol -> Type) (a6989586621680262249 :: Symbol) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowListWithSym2 a6989586621680262248 a6989586621680262247 :: TyFun Symbol Symbol -> Type) (a6989586621680262249 :: Symbol) = ShowListWith a6989586621680262248 a6989586621680262247 a6989586621680262249
type Apply (ShowsPrecSym2 arg6989586621680262276 arg6989586621680262275 :: TyFun Symbol Symbol -> Type) (arg6989586621680262277 :: Symbol) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrecSym2 arg6989586621680262276 arg6989586621680262275 :: TyFun Symbol Symbol -> Type) (arg6989586621680262277 :: Symbol) = ShowsPrec arg6989586621680262276 arg6989586621680262275 arg6989586621680262277
type Apply (ShowsPrec_6989586621680675637Sym2 a6989586621680675635 a6989586621680675634 :: TyFun Symbol Symbol -> Type) (a6989586621680675636 :: Symbol) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type Apply (ShowsPrec_6989586621680675637Sym2 a6989586621680675635 a6989586621680675634 :: TyFun Symbol Symbol -> Type) (a6989586621680675636 :: Symbol) = ShowsPrec_6989586621680675637 a6989586621680675635 a6989586621680675634 a6989586621680675636
type Apply (ShowsPrec_6989586621680335234Sym2 a6989586621680335232 a6989586621680335231 :: TyFun Symbol Symbol -> Type) (a6989586621680335233 :: Symbol) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (ShowsPrec_6989586621680335234Sym2 a6989586621680335232 a6989586621680335231 :: TyFun Symbol Symbol -> Type) (a6989586621680335233 :: Symbol) = ShowsPrec_6989586621680335234 a6989586621680335232 a6989586621680335231 a6989586621680335233
type Apply (ShowsPrec_6989586621680335263Sym2 a6989586621680335261 a6989586621680335260 :: TyFun Symbol Symbol -> Type) (a6989586621680335262 :: Symbol) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (ShowsPrec_6989586621680335263Sym2 a6989586621680335261 a6989586621680335260 :: TyFun Symbol Symbol -> Type) (a6989586621680335262 :: Symbol) = ShowsPrec_6989586621680335263 a6989586621680335261 a6989586621680335260 a6989586621680335262
type Apply (ShowsPrec_6989586621680262298Sym2 a6989586621680262296 a6989586621680262295 :: TyFun Symbol Symbol -> Type) (a6989586621680262297 :: Symbol) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680262298Sym2 a6989586621680262296 a6989586621680262295 :: TyFun Symbol Symbol -> Type) (a6989586621680262297 :: Symbol) = ShowsPrec_6989586621680262298 a6989586621680262296 a6989586621680262295 a6989586621680262297
type Apply (ShowsPrec_6989586621680262337Sym2 a6989586621680262335 a6989586621680262334 :: TyFun Symbol Symbol -> Type) (a6989586621680262336 :: Symbol) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680262337Sym2 a6989586621680262335 a6989586621680262334 :: TyFun Symbol Symbol -> Type) (a6989586621680262336 :: Symbol) = ShowsPrec_6989586621680262337 a6989586621680262335 a6989586621680262334 a6989586621680262336
type Apply (ShowsPrec_6989586621680280443Sym2 a6989586621680280441 a6989586621680280440 :: TyFun Symbol Symbol -> Type) (a6989586621680280442 :: Symbol) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680280443Sym2 a6989586621680280441 a6989586621680280440 :: TyFun Symbol Symbol -> Type) (a6989586621680280442 :: Symbol) = ShowsPrec_6989586621680280443 a6989586621680280441 a6989586621680280440 a6989586621680280442
type Apply (ShowsPrec_6989586621680280531Sym2 a6989586621680280529 a6989586621680280528 :: TyFun Symbol Symbol -> Type) (a6989586621680280530 :: Symbol) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680280531Sym2 a6989586621680280529 a6989586621680280528 :: TyFun Symbol Symbol -> Type) (a6989586621680280530 :: Symbol) = ShowsPrec_6989586621680280531 a6989586621680280529 a6989586621680280528 a6989586621680280530
type Apply (ShowsPrec_6989586621680865146Sym2 a6989586621680865144 a6989586621680865143 :: TyFun Symbol Symbol -> Type) (a6989586621680865145 :: Symbol) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ShowsPrec_6989586621680865146Sym2 a6989586621680865144 a6989586621680865143 :: TyFun Symbol Symbol -> Type) (a6989586621680865145 :: Symbol) = ShowsPrec_6989586621680865146 a6989586621680865144 a6989586621680865143 a6989586621680865145
type Apply (ShowsPrec_6989586621680865175Sym2 a6989586621680865173 a6989586621680865172 :: TyFun Symbol Symbol -> Type) (a6989586621680865174 :: Symbol) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ShowsPrec_6989586621680865175Sym2 a6989586621680865173 a6989586621680865172 :: TyFun Symbol Symbol -> Type) (a6989586621680865174 :: Symbol) = ShowsPrec_6989586621680865175 a6989586621680865173 a6989586621680865172 a6989586621680865174
type Apply (ShowsPrec_6989586621680865256Sym2 a6989586621680865254 a6989586621680865253 :: TyFun Symbol Symbol -> Type) (a6989586621680865255 :: Symbol) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ShowsPrec_6989586621680865256Sym2 a6989586621680865254 a6989586621680865253 :: TyFun Symbol Symbol -> Type) (a6989586621680865255 :: Symbol) = ShowsPrec_6989586621680865256 a6989586621680865254 a6989586621680865253 a6989586621680865255
type Apply (ShowsPrec_6989586621680865285Sym2 a6989586621680865283 a6989586621680865282 :: TyFun Symbol Symbol -> Type) (a6989586621680865284 :: Symbol) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ShowsPrec_6989586621680865285Sym2 a6989586621680865283 a6989586621680865282 :: TyFun Symbol Symbol -> Type) (a6989586621680865284 :: Symbol) = ShowsPrec_6989586621680865285 a6989586621680865283 a6989586621680865282 a6989586621680865284
type Apply (ShowsPrec_6989586621680865314Sym2 a6989586621680865312 a6989586621680865311 :: TyFun Symbol Symbol -> Type) (a6989586621680865313 :: Symbol) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ShowsPrec_6989586621680865314Sym2 a6989586621680865312 a6989586621680865311 :: TyFun Symbol Symbol -> Type) (a6989586621680865313 :: Symbol) = ShowsPrec_6989586621680865314 a6989586621680865312 a6989586621680865311 a6989586621680865313
type Apply (ShowsPrec_6989586621680865343Sym2 a6989586621680865341 a6989586621680865340 :: TyFun Symbol Symbol -> Type) (a6989586621680865342 :: Symbol) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ShowsPrec_6989586621680865343Sym2 a6989586621680865341 a6989586621680865340 :: TyFun Symbol Symbol -> Type) (a6989586621680865342 :: Symbol) = ShowsPrec_6989586621680865343 a6989586621680865341 a6989586621680865340 a6989586621680865342
type Apply (ShowsPrec_6989586621680865372Sym2 a6989586621680865370 a6989586621680865369 :: TyFun Symbol Symbol -> Type) (a6989586621680865371 :: Symbol) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ShowsPrec_6989586621680865372Sym2 a6989586621680865370 a6989586621680865369 :: TyFun Symbol Symbol -> Type) (a6989586621680865371 :: Symbol) = ShowsPrec_6989586621680865372 a6989586621680865370 a6989586621680865369 a6989586621680865371
type Apply (ShowsPrec_6989586621680865401Sym2 a6989586621680865399 a6989586621680865398 :: TyFun Symbol Symbol -> Type) (a6989586621680865400 :: Symbol) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ShowsPrec_6989586621680865401Sym2 a6989586621680865399 a6989586621680865398 :: TyFun Symbol Symbol -> Type) (a6989586621680865400 :: Symbol) = ShowsPrec_6989586621680865401 a6989586621680865399 a6989586621680865398 a6989586621680865400
type Apply (ShowsPrec_6989586621680865430Sym2 a6989586621680865428 a6989586621680865427 :: TyFun Symbol Symbol -> Type) (a6989586621680865429 :: Symbol) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ShowsPrec_6989586621680865430Sym2 a6989586621680865428 a6989586621680865427 :: TyFun Symbol Symbol -> Type) (a6989586621680865429 :: Symbol) = ShowsPrec_6989586621680865430 a6989586621680865428 a6989586621680865427 a6989586621680865429
type Apply (ShowsPrec_6989586621680262374Sym2 a6989586621680262372 a6989586621680262371 :: TyFun Symbol Symbol -> Type) (a6989586621680262373 :: Symbol) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680262374Sym2 a6989586621680262372 a6989586621680262371 :: TyFun Symbol Symbol -> Type) (a6989586621680262373 :: Symbol) = ShowsPrec_6989586621680262374 a6989586621680262372 a6989586621680262371 a6989586621680262373
type Apply (ShowsPrec_6989586621680280497Sym2 a6989586621680280495 a6989586621680280494 :: TyFun Symbol Symbol -> Type) (a6989586621680280496 :: Symbol) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680280497Sym2 a6989586621680280495 a6989586621680280494 :: TyFun Symbol Symbol -> Type) (a6989586621680280496 :: Symbol) = ShowsPrec_6989586621680280497 a6989586621680280495 a6989586621680280494 a6989586621680280496
type Apply (ShowsPrec_6989586621680882596Sym2 a6989586621680882594 a6989586621680882593 :: TyFun Symbol Symbol -> Type) (a6989586621680882595 :: Symbol) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ShowsPrec_6989586621680882596Sym2 a6989586621680882594 a6989586621680882593 :: TyFun Symbol Symbol -> Type) (a6989586621680882595 :: Symbol) = ShowsPrec_6989586621680882596 a6989586621680882594 a6989586621680882593 a6989586621680882595
type Apply (ShowsPrec_6989586621680711151Sym2 a6989586621680711149 a6989586621680711148 :: TyFun Symbol Symbol -> Type) (a6989586621680711150 :: Symbol) 
Instance details

Defined in Data.Singletons.Prelude.Const

type Apply (ShowsPrec_6989586621680711151Sym2 a6989586621680711149 a6989586621680711148 :: TyFun Symbol Symbol -> Type) (a6989586621680711150 :: Symbol) = ShowsPrec_6989586621680711151 a6989586621680711149 a6989586621680711148 a6989586621680711150
type Apply (ShowsPrec_6989586621680262392Sym2 a6989586621680262390 a6989586621680262389 :: TyFun Symbol Symbol -> Type) (a6989586621680262391 :: Symbol) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680262392Sym2 a6989586621680262390 a6989586621680262389 :: TyFun Symbol Symbol -> Type) (a6989586621680262391 :: Symbol) = ShowsPrec_6989586621680262392 a6989586621680262390 a6989586621680262389 a6989586621680262391
type Apply (ShowsPrec_6989586621680262411Sym2 a6989586621680262409 a6989586621680262408 :: TyFun Symbol Symbol -> Type) (a6989586621680262410 :: Symbol) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680262411Sym2 a6989586621680262409 a6989586621680262408 :: TyFun Symbol Symbol -> Type) (a6989586621680262410 :: Symbol) = ShowsPrec_6989586621680262411 a6989586621680262409 a6989586621680262408 a6989586621680262410
type Apply (ShowsPrec_6989586621680262431Sym2 a6989586621680262429 a6989586621680262428 :: TyFun Symbol Symbol -> Type) (a6989586621680262430 :: Symbol) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680262431Sym2 a6989586621680262429 a6989586621680262428 :: TyFun Symbol Symbol -> Type) (a6989586621680262430 :: Symbol) = ShowsPrec_6989586621680262431 a6989586621680262429 a6989586621680262428 a6989586621680262430
type Apply (ShowsPrec_6989586621680262452Sym2 a6989586621680262450 a6989586621680262449 :: TyFun Symbol Symbol -> Type) (a6989586621680262451 :: Symbol) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680262452Sym2 a6989586621680262450 a6989586621680262449 :: TyFun Symbol Symbol -> Type) (a6989586621680262451 :: Symbol) = ShowsPrec_6989586621680262452 a6989586621680262450 a6989586621680262449 a6989586621680262451
type Apply (ShowsPrec_6989586621680262474Sym2 a6989586621680262472 a6989586621680262471 :: TyFun Symbol Symbol -> Type) (a6989586621680262473 :: Symbol) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680262474Sym2 a6989586621680262472 a6989586621680262471 :: TyFun Symbol Symbol -> Type) (a6989586621680262473 :: Symbol) = ShowsPrec_6989586621680262474 a6989586621680262472 a6989586621680262471 a6989586621680262473
type Apply UnwordsSym0 (a6989586621679948970 :: [Symbol]) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply UnwordsSym0 (a6989586621679948970 :: [Symbol]) = Unwords a6989586621679948970
type Apply UnlinesSym0 (a6989586621679948981 :: [Symbol]) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply UnlinesSym0 (a6989586621679948981 :: [Symbol]) = Unlines a6989586621679948981
type Apply (Let6989586621679948974GoSym2 ws6989586621679948973 w6989586621679948972 :: TyFun [Symbol] Symbol -> Type) (a6989586621679948975 :: [Symbol]) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (Let6989586621679948974GoSym2 ws6989586621679948973 w6989586621679948972 :: TyFun [Symbol] Symbol -> Type) (a6989586621679948975 :: [Symbol]) = Let6989586621679948974Go ws6989586621679948973 w6989586621679948972 a6989586621679948975
type Apply (Let6989586621680262258ShowlSym4 s6989586621680262257 xs6989586621680262256 x6989586621680262255 showx6989586621680262254 :: TyFun [k2] Symbol -> Type) (a6989586621680262259 :: [k2]) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (Let6989586621680262258ShowlSym4 s6989586621680262257 xs6989586621680262256 x6989586621680262255 showx6989586621680262254 :: TyFun [k2] Symbol -> Type) (a6989586621680262259 :: [k2]) = Let6989586621680262258Showl s6989586621680262257 xs6989586621680262256 x6989586621680262255 showx6989586621680262254 a6989586621680262259
type BoxTypeSymbol ChunkOffsetTable64 Source # 
Instance details

Defined in Data.ByteString.IsoBaseFileFormat.Boxes.ChunkOffset

type BoxTypeSymbol ChunkOffsetTable32 Source # 
Instance details

Defined in Data.ByteString.IsoBaseFileFormat.Boxes.ChunkOffset

type Apply (Fail_6989586621679607690Sym0 :: TyFun Symbol [a6989586621679544294] -> Type) (a6989586621679607689 :: Symbol) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type Apply (Fail_6989586621679607690Sym0 :: TyFun Symbol [a6989586621679544294] -> Type) (a6989586621679607689 :: Symbol) = (Fail_6989586621679607690 a6989586621679607689 :: [a6989586621679544294])
type Apply (Fail_6989586621679607625Sym0 :: TyFun Symbol (Maybe a6989586621679544294) -> Type) (a6989586621679607624 :: Symbol) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type Apply (Fail_6989586621679607625Sym0 :: TyFun Symbol (Maybe a6989586621679544294) -> Type) (a6989586621679607624 :: Symbol) = (Fail_6989586621679607625 a6989586621679607624 :: Maybe a6989586621679544294)
type Apply (FromString_6989586621681196299Sym0 :: TyFun Symbol (Identity a6989586621681196255) -> Type) (a6989586621681196298 :: Symbol) 
Instance details

Defined in Data.Singletons.Prelude.IsString

type Apply (FromString_6989586621681196299Sym0 :: TyFun Symbol (Identity a6989586621681196255) -> Type) (a6989586621681196298 :: Symbol) = (FromString_6989586621681196299 a6989586621681196298 :: Identity a6989586621681196255)
type Apply (Fail_6989586621679544807Sym0 :: TyFun Symbol (m6989586621679544288 a6989586621679544294) -> Type) (a6989586621679544806 :: Symbol) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type Apply (Fail_6989586621679544807Sym0 :: TyFun Symbol (m6989586621679544288 a6989586621679544294) -> Type) (a6989586621679544806 :: Symbol) = (Fail_6989586621679544807 a6989586621679544806 :: m6989586621679544288 a6989586621679544294)
type Apply (FailSym0 :: TyFun Symbol (m6989586621679544288 a6989586621679544294) -> Type) (arg6989586621679544770 :: Symbol) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type Apply (FailSym0 :: TyFun Symbol (m6989586621679544288 a6989586621679544294) -> Type) (arg6989586621679544770 :: Symbol) = (Fail arg6989586621679544770 :: m6989586621679544288 a6989586621679544294)
type Apply ShowsPrec_6989586621680280557Sym0 (a6989586621680280554 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply ShowsPrec_6989586621680280557Sym0 (a6989586621680280554 :: Nat) = ShowsPrec_6989586621680280557Sym1 a6989586621680280554
type Apply ShowsPrec_6989586621680280584Sym0 (a6989586621680280581 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply ShowsPrec_6989586621680280584Sym0 (a6989586621680280581 :: Nat) = ShowsPrec_6989586621680280584Sym1 a6989586621680280581
type Apply ShowsNatSym0 (a6989586621680279794 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply ShowsNatSym0 (a6989586621680279794 :: Nat) = ShowsNatSym1 a6989586621680279794
type Apply ShowStringSym0 (a6989586621680262194 :: Symbol) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply ShowStringSym0 (a6989586621680262194 :: Symbol) = ShowStringSym1 a6989586621680262194
type Apply ShowCharSym0 (a6989586621680262209 :: Symbol) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply ShowCharSym0 (a6989586621680262209 :: Symbol) = ShowCharSym1 a6989586621680262209
type Apply ShowsPrec_6989586621680262357Sym0 (a6989586621680262354 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply ShowsPrec_6989586621680262357Sym0 (a6989586621680262354 :: Nat) = ShowsPrec_6989586621680262357Sym1 a6989586621680262354
type Apply ShowsPrec_6989586621680280406Sym0 (a6989586621680280403 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply ShowsPrec_6989586621680280406Sym0 (a6989586621680280403 :: Nat) = ShowsPrec_6989586621680280406Sym1 a6989586621680280403
type Apply ShowsPrec_6989586621680280612Sym0 (a6989586621680280609 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply ShowsPrec_6989586621680280612Sym0 (a6989586621680280609 :: Nat) = ShowsPrec_6989586621680280612Sym1 a6989586621680280609
type Apply ShowsPrec_6989586621680865201Sym0 (a6989586621680865198 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply ShowsPrec_6989586621680865201Sym0 (a6989586621680865198 :: Nat) = ShowsPrec_6989586621680865201Sym1 a6989586621680865198
type Apply ShowsPrec_6989586621680865227Sym0 (a6989586621680865224 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply ShowsPrec_6989586621680865227Sym0 (a6989586621680865224 :: Nat) = ShowsPrec_6989586621680865227Sym1 a6989586621680865224
type Apply ShowParenSym0 (a6989586621680262215 :: Bool) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply ShowParenSym0 (a6989586621680262215 :: Bool) = ShowParenSym1 a6989586621680262215
type Apply (Lambda_6989586621680262184Sym0 :: TyFun k (TyFun Symbol Symbol -> Type) -> Type) (a_69895866216802621796989586621680262183 :: k) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (Lambda_6989586621680262184Sym0 :: TyFun k (TyFun Symbol Symbol -> Type) -> Type) (a_69895866216802621796989586621680262183 :: k) = Lambda_6989586621680262184Sym1 a_69895866216802621796989586621680262183
type Apply (ShowsPrec_6989586621680262337Sym0 :: TyFun Nat ([a6989586621680260343] ~> (Symbol ~> Symbol)) -> Type) (a6989586621680262334 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680262337Sym0 :: TyFun Nat ([a6989586621680260343] ~> (Symbol ~> Symbol)) -> Type) (a6989586621680262334 :: Nat) = (ShowsPrec_6989586621680262337Sym1 a6989586621680262334 a6989586621680260343 :: TyFun [a6989586621680260343] (Symbol ~> Symbol) -> Type)
type Apply (ShowsPrec_6989586621680280443Sym0 :: TyFun Nat (Maybe a3530822107858468865 ~> (Symbol ~> Symbol)) -> Type) (a6989586621680280440 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680280443Sym0 :: TyFun Nat (Maybe a3530822107858468865 ~> (Symbol ~> Symbol)) -> Type) (a6989586621680280440 :: Nat) = (ShowsPrec_6989586621680280443Sym1 a6989586621680280440 a3530822107858468865 :: TyFun (Maybe a3530822107858468865) (Symbol ~> Symbol) -> Type)
type Apply (ShowsPrec_6989586621680280557Sym1 a6989586621680280554 :: TyFun Bool (Symbol ~> Symbol) -> Type) (a6989586621680280555 :: Bool) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680280557Sym1 a6989586621680280554 :: TyFun Bool (Symbol ~> Symbol) -> Type) (a6989586621680280555 :: Bool) = ShowsPrec_6989586621680280557Sym2 a6989586621680280554 a6989586621680280555
type Apply (ShowsPrec_6989586621680280584Sym1 a6989586621680280581 :: TyFun Ordering (Symbol ~> Symbol) -> Type) (a6989586621680280582 :: Ordering) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680280584Sym1 a6989586621680280581 :: TyFun Ordering (Symbol ~> Symbol) -> Type) (a6989586621680280582 :: Ordering) = ShowsPrec_6989586621680280584Sym2 a6989586621680280581 a6989586621680280582
type Apply (ShowsPrec_6989586621680262357Sym1 a6989586621680262354 :: TyFun Symbol (Symbol ~> Symbol) -> Type) (a6989586621680262355 :: Symbol) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680262357Sym1 a6989586621680262354 :: TyFun Symbol (Symbol ~> Symbol) -> Type) (a6989586621680262355 :: Symbol) = ShowsPrec_6989586621680262357Sym2 a6989586621680262354 a6989586621680262355
type Apply (ShowsPrec_6989586621680280406Sym1 a6989586621680280403 :: TyFun () (Symbol ~> Symbol) -> Type) (a6989586621680280404 :: ()) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680280406Sym1 a6989586621680280403 :: TyFun () (Symbol ~> Symbol) -> Type) (a6989586621680280404 :: ()) = ShowsPrec_6989586621680280406Sym2 a6989586621680280403 a6989586621680280404
type Apply (ShowsSym0 :: TyFun a6989586621680260310 (Symbol ~> Symbol) -> Type) (a6989586621680262267 :: a6989586621680260310) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsSym0 :: TyFun a6989586621680260310 (Symbol ~> Symbol) -> Type) (a6989586621680262267 :: a6989586621680260310) = ShowsSym1 a6989586621680262267
type Apply (ShowsPrec_6989586621680280612Sym1 a6989586621680280609 :: TyFun Void (Symbol ~> Symbol) -> Type) (a6989586621680280610 :: Void) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680280612Sym1 a6989586621680280609 :: TyFun Void (Symbol ~> Symbol) -> Type) (a6989586621680280610 :: Void) = ShowsPrec_6989586621680280612Sym2 a6989586621680280609 a6989586621680280610
type Apply (ShowsPrec_6989586621680865201Sym1 a6989586621680865198 :: TyFun All (Symbol ~> Symbol) -> Type) (a6989586621680865199 :: All) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ShowsPrec_6989586621680865201Sym1 a6989586621680865198 :: TyFun All (Symbol ~> Symbol) -> Type) (a6989586621680865199 :: All) = ShowsPrec_6989586621680865201Sym2 a6989586621680865198 a6989586621680865199
type Apply (ShowsPrec_6989586621680865227Sym1 a6989586621680865224 :: TyFun Any (Symbol ~> Symbol) -> Type) (a6989586621680865225 :: Any) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ShowsPrec_6989586621680865227Sym1 a6989586621680865224 :: TyFun Any (Symbol ~> Symbol) -> Type) (a6989586621680865225 :: Any) = ShowsPrec_6989586621680865227Sym2 a6989586621680865224 a6989586621680865225
type Apply (ShowsPrec_6989586621680262298Sym0 :: TyFun Nat (a6989586621680260325 ~> (Symbol ~> Symbol)) -> Type) (a6989586621680262295 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680262298Sym0 :: TyFun Nat (a6989586621680260325 ~> (Symbol ~> Symbol)) -> Type) (a6989586621680262295 :: Nat) = (ShowsPrec_6989586621680262298Sym1 a6989586621680262295 a6989586621680260325 :: TyFun a6989586621680260325 (Symbol ~> Symbol) -> Type)
type Apply (ShowsPrecSym0 :: TyFun Nat (a6989586621680260325 ~> (Symbol ~> Symbol)) -> Type) (arg6989586621680262275 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrecSym0 :: TyFun Nat (a6989586621680260325 ~> (Symbol ~> Symbol)) -> Type) (arg6989586621680262275 :: Nat) = (ShowsPrecSym1 arg6989586621680262275 a6989586621680260325 :: TyFun a6989586621680260325 (Symbol ~> Symbol) -> Type)
type Apply (ShowsPrec_6989586621680865314Sym0 :: TyFun Nat (Min a6989586621679050961 ~> (Symbol ~> Symbol)) -> Type) (a6989586621680865311 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ShowsPrec_6989586621680865314Sym0 :: TyFun Nat (Min a6989586621679050961 ~> (Symbol ~> Symbol)) -> Type) (a6989586621680865311 :: Nat) = (ShowsPrec_6989586621680865314Sym1 a6989586621680865311 a6989586621679050961 :: TyFun (Min a6989586621679050961) (Symbol ~> Symbol) -> Type)
type Apply (ShowsPrec_6989586621680865343Sym0 :: TyFun Nat (Max a6989586621679050967 ~> (Symbol ~> Symbol)) -> Type) (a6989586621680865340 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ShowsPrec_6989586621680865343Sym0 :: TyFun Nat (Max a6989586621679050967 ~> (Symbol ~> Symbol)) -> Type) (a6989586621680865340 :: Nat) = (ShowsPrec_6989586621680865343Sym1 a6989586621680865340 a6989586621679050967 :: TyFun (Max a6989586621679050967) (Symbol ~> Symbol) -> Type)
type Apply (ShowsPrec_6989586621680865372Sym0 :: TyFun Nat (First a6989586621679050981 ~> (Symbol ~> Symbol)) -> Type) (a6989586621680865369 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ShowsPrec_6989586621680865372Sym0 :: TyFun Nat (First a6989586621679050981 ~> (Symbol ~> Symbol)) -> Type) (a6989586621680865369 :: Nat) = (ShowsPrec_6989586621680865372Sym1 a6989586621680865369 a6989586621679050981 :: TyFun (First a6989586621679050981) (Symbol ~> Symbol) -> Type)
type Apply (ShowsPrec_6989586621680865401Sym0 :: TyFun Nat (Last a6989586621679050987 ~> (Symbol ~> Symbol)) -> Type) (a6989586621680865398 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ShowsPrec_6989586621680865401Sym0 :: TyFun Nat (Last a6989586621679050987 ~> (Symbol ~> Symbol)) -> Type) (a6989586621680865398 :: Nat) = (ShowsPrec_6989586621680865401Sym1 a6989586621680865398 a6989586621679050987 :: TyFun (Last a6989586621679050987) (Symbol ~> Symbol) -> Type)
type Apply (ShowsPrec_6989586621680865430Sym0 :: TyFun Nat (WrappedMonoid m6989586621679050993 ~> (Symbol ~> Symbol)) -> Type) (a6989586621680865427 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ShowsPrec_6989586621680865430Sym0 :: TyFun Nat (WrappedMonoid m6989586621679050993 ~> (Symbol ~> Symbol)) -> Type) (a6989586621680865427 :: Nat) = (ShowsPrec_6989586621680865430Sym1 a6989586621680865427 m6989586621679050993 :: TyFun (WrappedMonoid m6989586621679050993) (Symbol ~> Symbol) -> Type)
type Apply (ShowsPrec_6989586621680865146Sym0 :: TyFun Nat (Option a6989586621679050999 ~> (Symbol ~> Symbol)) -> Type) (a6989586621680865143 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ShowsPrec_6989586621680865146Sym0 :: TyFun Nat (Option a6989586621679050999 ~> (Symbol ~> Symbol)) -> Type) (a6989586621680865143 :: Nat) = (ShowsPrec_6989586621680865146Sym1 a6989586621680865143 a6989586621679050999 :: TyFun (Option a6989586621679050999) (Symbol ~> Symbol) -> Type)
type Apply (ShowsPrec_6989586621680675637Sym0 :: TyFun Nat (Identity a6989586621680675127 ~> (Symbol ~> Symbol)) -> Type) (a6989586621680675634 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type Apply (ShowsPrec_6989586621680675637Sym0 :: TyFun Nat (Identity a6989586621680675127 ~> (Symbol ~> Symbol)) -> Type) (a6989586621680675634 :: Nat) = (ShowsPrec_6989586621680675637Sym1 a6989586621680675634 a6989586621680675127 :: TyFun (Identity a6989586621680675127) (Symbol ~> Symbol) -> Type)
type Apply (ShowsPrec_6989586621680335234Sym0 :: TyFun Nat (First a6989586621679072624 ~> (Symbol ~> Symbol)) -> Type) (a6989586621680335231 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (ShowsPrec_6989586621680335234Sym0 :: TyFun Nat (First a6989586621679072624 ~> (Symbol ~> Symbol)) -> Type) (a6989586621680335231 :: Nat) = (ShowsPrec_6989586621680335234Sym1 a6989586621680335231 a6989586621679072624 :: TyFun (First a6989586621679072624) (Symbol ~> Symbol) -> Type)
type Apply (ShowsPrec_6989586621680335263Sym0 :: TyFun Nat (Last a6989586621679072619 ~> (Symbol ~> Symbol)) -> Type) (a6989586621680335260 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (ShowsPrec_6989586621680335263Sym0 :: TyFun Nat (Last a6989586621679072619 ~> (Symbol ~> Symbol)) -> Type) (a6989586621680335260 :: Nat) = (ShowsPrec_6989586621680335263Sym1 a6989586621680335260 a6989586621679072619 :: TyFun (Last a6989586621679072619) (Symbol ~> Symbol) -> Type)
type Apply (ShowsPrec_6989586621680865175Sym0 :: TyFun Nat (Dual a6989586621679072595 ~> (Symbol ~> Symbol)) -> Type) (a6989586621680865172 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ShowsPrec_6989586621680865175Sym0 :: TyFun Nat (Dual a6989586621679072595 ~> (Symbol ~> Symbol)) -> Type) (a6989586621680865172 :: Nat) = (ShowsPrec_6989586621680865175Sym1 a6989586621680865172 a6989586621679072595 :: TyFun (Dual a6989586621679072595) (Symbol ~> Symbol) -> Type)
type Apply (ShowsPrec_6989586621680865256Sym0 :: TyFun Nat (Sum a6989586621679072580 ~> (Symbol ~> Symbol)) -> Type) (a6989586621680865253 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ShowsPrec_6989586621680865256Sym0 :: TyFun Nat (Sum a6989586621679072580 ~> (Symbol ~> Symbol)) -> Type) (a6989586621680865253 :: Nat) = (ShowsPrec_6989586621680865256Sym1 a6989586621680865253 a6989586621679072580 :: TyFun (Sum a6989586621679072580) (Symbol ~> Symbol) -> Type)
type Apply (ShowsPrec_6989586621680865285Sym0 :: TyFun Nat (Product a6989586621679072585 ~> (Symbol ~> Symbol)) -> Type) (a6989586621680865282 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ShowsPrec_6989586621680865285Sym0 :: TyFun Nat (Product a6989586621679072585 ~> (Symbol ~> Symbol)) -> Type) (a6989586621680865282 :: Nat) = (ShowsPrec_6989586621680865285Sym1 a6989586621680865282 a6989586621679072585 :: TyFun (Product a6989586621679072585) (Symbol ~> Symbol) -> Type)
type Apply (ShowsPrec_6989586621680280531Sym0 :: TyFun Nat (NonEmpty a6989586621679055391 ~> (Symbol ~> Symbol)) -> Type) (a6989586621680280528 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680280531Sym0 :: TyFun Nat (NonEmpty a6989586621679055391 ~> (Symbol ~> Symbol)) -> Type) (a6989586621680280528 :: Nat) = (ShowsPrec_6989586621680280531Sym1 a6989586621680280528 a6989586621679055391 :: TyFun (NonEmpty a6989586621679055391) (Symbol ~> Symbol) -> Type)
type Apply (Let6989586621679948974GoSym0 :: TyFun k1 (TyFun k2 (TyFun [Symbol] Symbol -> Type) -> Type) -> Type) (w6989586621679948972 :: k1) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (Let6989586621679948974GoSym0 :: TyFun k1 (TyFun k2 (TyFun [Symbol] Symbol -> Type) -> Type) -> Type) (w6989586621679948972 :: k1) = (Let6989586621679948974GoSym1 w6989586621679948972 :: TyFun k2 (TyFun [Symbol] Symbol -> Type) -> Type)
type Apply (ShowsPrec_6989586621680280497Sym0 :: TyFun Nat (Either a6989586621679073691 b6989586621679073692 ~> (Symbol ~> Symbol)) -> Type) (a6989586621680280494 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680280497Sym0 :: TyFun Nat (Either a6989586621679073691 b6989586621679073692 ~> (Symbol ~> Symbol)) -> Type) (a6989586621680280494 :: Nat) = (ShowsPrec_6989586621680280497Sym1 a6989586621680280494 a6989586621679073691 b6989586621679073692 :: TyFun (Either a6989586621679073691 b6989586621679073692) (Symbol ~> Symbol) -> Type)
type Apply (ShowsPrec_6989586621680262298Sym1 a6989586621680262295 a6989586621680260325 :: TyFun a6989586621680260325 (Symbol ~> Symbol) -> Type) (a6989586621680262296 :: a6989586621680260325) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680262298Sym1 a6989586621680262295 a6989586621680260325 :: TyFun a6989586621680260325 (Symbol ~> Symbol) -> Type) (a6989586621680262296 :: a6989586621680260325) = ShowsPrec_6989586621680262298Sym2 a6989586621680262295 a6989586621680262296
type Apply (ShowsPrecSym1 arg6989586621680262275 a6989586621680260325 :: TyFun a6989586621680260325 (Symbol ~> Symbol) -> Type) (arg6989586621680262276 :: a6989586621680260325) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrecSym1 arg6989586621680262275 a6989586621680260325 :: TyFun a6989586621680260325 (Symbol ~> Symbol) -> Type) (arg6989586621680262276 :: a6989586621680260325) = ShowsPrecSym2 arg6989586621680262275 arg6989586621680262276
type Apply (ShowsPrec_6989586621680262374Sym0 :: TyFun Nat ((a6989586621680260347, b6989586621680260348) ~> (Symbol ~> Symbol)) -> Type) (a6989586621680262371 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680262374Sym0 :: TyFun Nat ((a6989586621680260347, b6989586621680260348) ~> (Symbol ~> Symbol)) -> Type) (a6989586621680262371 :: Nat) = (ShowsPrec_6989586621680262374Sym1 a6989586621680262371 a6989586621680260347 b6989586621680260348 :: TyFun (a6989586621680260347, b6989586621680260348) (Symbol ~> Symbol) -> Type)
type Apply (ShowsPrec_6989586621680882596Sym0 :: TyFun Nat (Arg a6989586621680881245 b6989586621680881246 ~> (Symbol ~> Symbol)) -> Type) (a6989586621680882593 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ShowsPrec_6989586621680882596Sym0 :: TyFun Nat (Arg a6989586621680881245 b6989586621680881246 ~> (Symbol ~> Symbol)) -> Type) (a6989586621680882593 :: Nat) = (ShowsPrec_6989586621680882596Sym1 a6989586621680882593 a6989586621680881245 b6989586621680881246 :: TyFun (Arg a6989586621680881245 b6989586621680881246) (Symbol ~> Symbol) -> Type)
type Apply (Let6989586621679948974GoSym1 w6989586621679948972 :: TyFun k1 (TyFun [Symbol] Symbol -> Type) -> Type) (ws6989586621679948973 :: k1) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (Let6989586621679948974GoSym1 w6989586621679948972 :: TyFun k1 (TyFun [Symbol] Symbol -> Type) -> Type) (ws6989586621679948973 :: k1) = Let6989586621679948974GoSym2 w6989586621679948972 ws6989586621679948973
type Apply (ShowsPrec_6989586621680262392Sym0 :: TyFun Nat ((a6989586621680260352, b6989586621680260353, c6989586621680260354) ~> (Symbol ~> Symbol)) -> Type) (a6989586621680262389 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680262392Sym0 :: TyFun Nat ((a6989586621680260352, b6989586621680260353, c6989586621680260354) ~> (Symbol ~> Symbol)) -> Type) (a6989586621680262389 :: Nat) = (ShowsPrec_6989586621680262392Sym1 a6989586621680262389 a6989586621680260352 b6989586621680260353 c6989586621680260354 :: TyFun (a6989586621680260352, b6989586621680260353, c6989586621680260354) (Symbol ~> Symbol) -> Type)
type Apply (ShowsPrec_6989586621680711151Sym0 :: TyFun Nat (Const a6989586621680710532 b6989586621680710533 ~> (Symbol ~> Symbol)) -> Type) (a6989586621680711148 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Const

type Apply (ShowsPrec_6989586621680711151Sym0 :: TyFun Nat (Const a6989586621680710532 b6989586621680710533 ~> (Symbol ~> Symbol)) -> Type) (a6989586621680711148 :: Nat) = (ShowsPrec_6989586621680711151Sym1 a6989586621680711148 a6989586621680710532 b6989586621680710533 :: TyFun (Const a6989586621680710532 b6989586621680710533) (Symbol ~> Symbol) -> Type)
type Apply (Let6989586621680262258ShowlSym1 showx6989586621680262254 :: TyFun k1 (TyFun k3 (TyFun Symbol (TyFun [k2] Symbol -> Type) -> Type) -> Type) -> Type) (x6989586621680262255 :: k1) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (Let6989586621680262258ShowlSym1 showx6989586621680262254 :: TyFun k1 (TyFun k3 (TyFun Symbol (TyFun [k2] Symbol -> Type) -> Type) -> Type) -> Type) (x6989586621680262255 :: k1) = (Let6989586621680262258ShowlSym2 showx6989586621680262254 x6989586621680262255 :: TyFun k3 (TyFun Symbol (TyFun [k2] Symbol -> Type) -> Type) -> Type)
type Apply (Lambda_6989586621680262237Sym0 :: TyFun k1 (TyFun k2 (TyFun (Symbol ~> c6989586621679519978) (TyFun (a6989586621679519979 ~> Symbol) (TyFun a6989586621679519979 c6989586621679519978 -> Type) -> Type) -> Type) -> Type) -> Type) (ss6989586621680262235 :: k1) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (Lambda_6989586621680262237Sym0 :: TyFun k1 (TyFun k2 (TyFun (Symbol ~> c6989586621679519978) (TyFun (a6989586621679519979 ~> Symbol) (TyFun a6989586621679519979 c6989586621679519978 -> Type) -> Type) -> Type) -> Type) -> Type) (ss6989586621680262235 :: k1) = (Lambda_6989586621680262237Sym1 ss6989586621680262235 :: TyFun k2 (TyFun (Symbol ~> c6989586621679519978) (TyFun (a6989586621679519979 ~> Symbol) (TyFun a6989586621679519979 c6989586621679519978 -> Type) -> Type) -> Type) -> Type)
type Apply (ShowsPrec_6989586621680262411Sym0 :: TyFun Nat ((a6989586621680260359, b6989586621680260360, c6989586621680260361, d6989586621680260362) ~> (Symbol ~> Symbol)) -> Type) (a6989586621680262408 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680262411Sym0 :: TyFun Nat ((a6989586621680260359, b6989586621680260360, c6989586621680260361, d6989586621680260362) ~> (Symbol ~> Symbol)) -> Type) (a6989586621680262408 :: Nat) = (ShowsPrec_6989586621680262411Sym1 a6989586621680262408 a6989586621680260359 b6989586621680260360 c6989586621680260361 d6989586621680260362 :: TyFun (a6989586621680260359, b6989586621680260360, c6989586621680260361, d6989586621680260362) (Symbol ~> Symbol) -> Type)
type Apply (Let6989586621680262258ShowlSym2 x6989586621680262255 showx6989586621680262254 :: TyFun k3 (TyFun Symbol (TyFun [k2] Symbol -> Type) -> Type) -> Type) (xs6989586621680262256 :: k3) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (Let6989586621680262258ShowlSym2 x6989586621680262255 showx6989586621680262254 :: TyFun k3 (TyFun Symbol (TyFun [k2] Symbol -> Type) -> Type) -> Type) (xs6989586621680262256 :: k3) = Let6989586621680262258ShowlSym3 x6989586621680262255 showx6989586621680262254 xs6989586621680262256
type Apply (Lambda_6989586621680262237Sym1 ss6989586621680262235 :: TyFun k1 (TyFun (Symbol ~> c6989586621679519978) (TyFun (a6989586621679519979 ~> Symbol) (TyFun a6989586621679519979 c6989586621679519978 -> Type) -> Type) -> Type) -> Type) (a_69895866216802622336989586621680262236 :: k1) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (Lambda_6989586621680262237Sym1 ss6989586621680262235 :: TyFun k1 (TyFun (Symbol ~> c6989586621679519978) (TyFun (a6989586621679519979 ~> Symbol) (TyFun a6989586621679519979 c6989586621679519978 -> Type) -> Type) -> Type) -> Type) (a_69895866216802622336989586621680262236 :: k1) = (Lambda_6989586621680262237Sym2 ss6989586621680262235 a_69895866216802622336989586621680262236 :: TyFun (Symbol ~> c6989586621679519978) (TyFun (a6989586621679519979 ~> Symbol) (TyFun a6989586621679519979 c6989586621679519978 -> Type) -> Type) -> Type)
type Apply (ShowsPrec_6989586621680262431Sym0 :: TyFun Nat ((a6989586621680260368, b6989586621680260369, c6989586621680260370, d6989586621680260371, e6989586621680260372) ~> (Symbol ~> Symbol)) -> Type) (a6989586621680262428 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680262431Sym0 :: TyFun Nat ((a6989586621680260368, b6989586621680260369, c6989586621680260370, d6989586621680260371, e6989586621680260372) ~> (Symbol ~> Symbol)) -> Type) (a6989586621680262428 :: Nat) = (ShowsPrec_6989586621680262431Sym1 a6989586621680262428 a6989586621680260368 b6989586621680260369 c6989586621680260370 d6989586621680260371 e6989586621680260372 :: TyFun (a6989586621680260368, b6989586621680260369, c6989586621680260370, d6989586621680260371, e6989586621680260372) (Symbol ~> Symbol) -> Type)
type Apply (Let6989586621680262258ShowlSym3 xs6989586621680262256 x6989586621680262255 showx6989586621680262254 :: TyFun Symbol (TyFun [k2] Symbol -> Type) -> Type) (s6989586621680262257 :: Symbol) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (Let6989586621680262258ShowlSym3 xs6989586621680262256 x6989586621680262255 showx6989586621680262254 :: TyFun Symbol (TyFun [k2] Symbol -> Type) -> Type) (s6989586621680262257 :: Symbol) = Let6989586621680262258ShowlSym4 xs6989586621680262256 x6989586621680262255 showx6989586621680262254 s6989586621680262257
type Apply (ShowsPrec_6989586621680262452Sym0 :: TyFun Nat ((a6989586621680260379, b6989586621680260380, c6989586621680260381, d6989586621680260382, e6989586621680260383, f6989586621680260384) ~> (Symbol ~> Symbol)) -> Type) (a6989586621680262449 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680262452Sym0 :: TyFun Nat ((a6989586621680260379, b6989586621680260380, c6989586621680260381, d6989586621680260382, e6989586621680260383, f6989586621680260384) ~> (Symbol ~> Symbol)) -> Type) (a6989586621680262449 :: Nat) = (ShowsPrec_6989586621680262452Sym1 a6989586621680262449 a6989586621680260379 b6989586621680260380 c6989586621680260381 d6989586621680260382 e6989586621680260383 f6989586621680260384 :: TyFun (a6989586621680260379, b6989586621680260380, c6989586621680260381, d6989586621680260382, e6989586621680260383, f6989586621680260384) (Symbol ~> Symbol) -> Type)
type Apply (ShowsPrec_6989586621680262474Sym0 :: TyFun Nat ((a6989586621680260392, b6989586621680260393, c6989586621680260394, d6989586621680260395, e6989586621680260396, f6989586621680260397, g6989586621680260398) ~> (Symbol ~> Symbol)) -> Type) (a6989586621680262471 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680262474Sym0 :: TyFun Nat ((a6989586621680260392, b6989586621680260393, c6989586621680260394, d6989586621680260395, e6989586621680260396, f6989586621680260397, g6989586621680260398) ~> (Symbol ~> Symbol)) -> Type) (a6989586621680262471 :: Nat) = (ShowsPrec_6989586621680262474Sym1 a6989586621680262471 a6989586621680260392 b6989586621680260393 c6989586621680260394 d6989586621680260395 e6989586621680260396 f6989586621680260397 g6989586621680260398 :: TyFun (a6989586621680260392, b6989586621680260393, c6989586621680260394, d6989586621680260395, e6989586621680260396, f6989586621680260397, g6989586621680260398) (Symbol ~> Symbol) -> Type)
type Apply Show_tupleSym0 (a6989586621680262229 :: [Symbol ~> Symbol]) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply Show_tupleSym0 (a6989586621680262229 :: [Symbol ~> Symbol]) = Show_tupleSym1 a6989586621680262229
type Apply (ShowList_6989586621680262318Sym0 :: TyFun [a6989586621680260325] (Symbol ~> Symbol) -> Type) (a6989586621680262316 :: [a6989586621680260325]) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowList_6989586621680262318Sym0 :: TyFun [a6989586621680260325] (Symbol ~> Symbol) -> Type) (a6989586621680262316 :: [a6989586621680260325]) = ShowList_6989586621680262318Sym1 a6989586621680262316
type Apply (ShowListSym0 :: TyFun [a6989586621680260325] (Symbol ~> Symbol) -> Type) (arg6989586621680262283 :: [a6989586621680260325]) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowListSym0 :: TyFun [a6989586621680260325] (Symbol ~> Symbol) -> Type) (arg6989586621680262283 :: [a6989586621680260325]) = ShowListSym1 arg6989586621680262283
type Apply (ShowListWithSym1 a6989586621680262247 :: TyFun [a6989586621680260309] (Symbol ~> Symbol) -> Type) (a6989586621680262248 :: [a6989586621680260309]) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowListWithSym1 a6989586621680262247 :: TyFun [a6989586621680260309] (Symbol ~> Symbol) -> Type) (a6989586621680262248 :: [a6989586621680260309]) = ShowListWithSym2 a6989586621680262247 a6989586621680262248
type Apply (ShowsPrec_6989586621680262337Sym1 a6989586621680262334 a6989586621680260343 :: TyFun [a6989586621680260343] (Symbol ~> Symbol) -> Type) (a6989586621680262335 :: [a6989586621680260343]) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680262337Sym1 a6989586621680262334 a6989586621680260343 :: TyFun [a6989586621680260343] (Symbol ~> Symbol) -> Type) (a6989586621680262335 :: [a6989586621680260343]) = ShowsPrec_6989586621680262337Sym2 a6989586621680262334 a6989586621680262335
type Apply (ShowsPrec_6989586621680280443Sym1 a6989586621680280440 a3530822107858468865 :: TyFun (Maybe a3530822107858468865) (Symbol ~> Symbol) -> Type) (a6989586621680280441 :: Maybe a3530822107858468865) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680280443Sym1 a6989586621680280440 a3530822107858468865 :: TyFun (Maybe a3530822107858468865) (Symbol ~> Symbol) -> Type) (a6989586621680280441 :: Maybe a3530822107858468865) = ShowsPrec_6989586621680280443Sym2 a6989586621680280440 a6989586621680280441
type Apply (ShowsPrec_6989586621680865314Sym1 a6989586621680865311 a6989586621679050961 :: TyFun (Min a6989586621679050961) (Symbol ~> Symbol) -> Type) (a6989586621680865312 :: Min a6989586621679050961) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ShowsPrec_6989586621680865314Sym1 a6989586621680865311 a6989586621679050961 :: TyFun (Min a6989586621679050961) (Symbol ~> Symbol) -> Type) (a6989586621680865312 :: Min a6989586621679050961) = ShowsPrec_6989586621680865314Sym2 a6989586621680865311 a6989586621680865312
type Apply (ShowsPrec_6989586621680865343Sym1 a6989586621680865340 a6989586621679050967 :: TyFun (Max a6989586621679050967) (Symbol ~> Symbol) -> Type) (a6989586621680865341 :: Max a6989586621679050967) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ShowsPrec_6989586621680865343Sym1 a6989586621680865340 a6989586621679050967 :: TyFun (Max a6989586621679050967) (Symbol ~> Symbol) -> Type) (a6989586621680865341 :: Max a6989586621679050967) = ShowsPrec_6989586621680865343Sym2 a6989586621680865340 a6989586621680865341
type Apply (ShowsPrec_6989586621680865372Sym1 a6989586621680865369 a6989586621679050981 :: TyFun (First a6989586621679050981) (Symbol ~> Symbol) -> Type) (a6989586621680865370 :: First a6989586621679050981) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ShowsPrec_6989586621680865372Sym1 a6989586621680865369 a6989586621679050981 :: TyFun (First a6989586621679050981) (Symbol ~> Symbol) -> Type) (a6989586621680865370 :: First a6989586621679050981) = ShowsPrec_6989586621680865372Sym2 a6989586621680865369 a6989586621680865370
type Apply (ShowsPrec_6989586621680865401Sym1 a6989586621680865398 a6989586621679050987 :: TyFun (Last a6989586621679050987) (Symbol ~> Symbol) -> Type) (a6989586621680865399 :: Last a6989586621679050987) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ShowsPrec_6989586621680865401Sym1 a6989586621680865398 a6989586621679050987 :: TyFun (Last a6989586621679050987) (Symbol ~> Symbol) -> Type) (a6989586621680865399 :: Last a6989586621679050987) = ShowsPrec_6989586621680865401Sym2 a6989586621680865398 a6989586621680865399
type Apply (ShowsPrec_6989586621680865430Sym1 a6989586621680865427 m6989586621679050993 :: TyFun (WrappedMonoid m6989586621679050993) (Symbol ~> Symbol) -> Type) (a6989586621680865428 :: WrappedMonoid m6989586621679050993) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ShowsPrec_6989586621680865430Sym1 a6989586621680865427 m6989586621679050993 :: TyFun (WrappedMonoid m6989586621679050993) (Symbol ~> Symbol) -> Type) (a6989586621680865428 :: WrappedMonoid m6989586621679050993) = ShowsPrec_6989586621680865430Sym2 a6989586621680865427 a6989586621680865428
type Apply (ShowsPrec_6989586621680865146Sym1 a6989586621680865143 a6989586621679050999 :: TyFun (Option a6989586621679050999) (Symbol ~> Symbol) -> Type) (a6989586621680865144 :: Option a6989586621679050999) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ShowsPrec_6989586621680865146Sym1 a6989586621680865143 a6989586621679050999 :: TyFun (Option a6989586621679050999) (Symbol ~> Symbol) -> Type) (a6989586621680865144 :: Option a6989586621679050999) = ShowsPrec_6989586621680865146Sym2 a6989586621680865143 a6989586621680865144
type Apply (ShowsPrec_6989586621680675637Sym1 a6989586621680675634 a6989586621680675127 :: TyFun (Identity a6989586621680675127) (Symbol ~> Symbol) -> Type) (a6989586621680675635 :: Identity a6989586621680675127) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type Apply (ShowsPrec_6989586621680675637Sym1 a6989586621680675634 a6989586621680675127 :: TyFun (Identity a6989586621680675127) (Symbol ~> Symbol) -> Type) (a6989586621680675635 :: Identity a6989586621680675127) = ShowsPrec_6989586621680675637Sym2 a6989586621680675634 a6989586621680675635
type Apply (ShowsPrec_6989586621680335234Sym1 a6989586621680335231 a6989586621679072624 :: TyFun (First a6989586621679072624) (Symbol ~> Symbol) -> Type) (a6989586621680335232 :: First a6989586621679072624) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (ShowsPrec_6989586621680335234Sym1 a6989586621680335231 a6989586621679072624 :: TyFun (First a6989586621679072624) (Symbol ~> Symbol) -> Type) (a6989586621680335232 :: First a6989586621679072624) = ShowsPrec_6989586621680335234Sym2 a6989586621680335231 a6989586621680335232
type Apply (ShowsPrec_6989586621680335263Sym1 a6989586621680335260 a6989586621679072619 :: TyFun (Last a6989586621679072619) (Symbol ~> Symbol) -> Type) (a6989586621680335261 :: Last a6989586621679072619) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (ShowsPrec_6989586621680335263Sym1 a6989586621680335260 a6989586621679072619 :: TyFun (Last a6989586621679072619) (Symbol ~> Symbol) -> Type) (a6989586621680335261 :: Last a6989586621679072619) = ShowsPrec_6989586621680335263Sym2 a6989586621680335260 a6989586621680335261
type Apply (ShowsPrec_6989586621680865175Sym1 a6989586621680865172 a6989586621679072595 :: TyFun (Dual a6989586621679072595) (Symbol ~> Symbol) -> Type) (a6989586621680865173 :: Dual a6989586621679072595) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ShowsPrec_6989586621680865175Sym1 a6989586621680865172 a6989586621679072595 :: TyFun (Dual a6989586621679072595) (Symbol ~> Symbol) -> Type) (a6989586621680865173 :: Dual a6989586621679072595) = ShowsPrec_6989586621680865175Sym2 a6989586621680865172 a6989586621680865173
type Apply (ShowsPrec_6989586621680865256Sym1 a6989586621680865253 a6989586621679072580 :: TyFun (Sum a6989586621679072580) (Symbol ~> Symbol) -> Type) (a6989586621680865254 :: Sum a6989586621679072580) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ShowsPrec_6989586621680865256Sym1 a6989586621680865253 a6989586621679072580 :: TyFun (Sum a6989586621679072580) (Symbol ~> Symbol) -> Type) (a6989586621680865254 :: Sum a6989586621679072580) = ShowsPrec_6989586621680865256Sym2 a6989586621680865253 a6989586621680865254
type Apply (ShowsPrec_6989586621680865285Sym1 a6989586621680865282 a6989586621679072585 :: TyFun (Product a6989586621679072585) (Symbol ~> Symbol) -> Type) (a6989586621680865283 :: Product a6989586621679072585) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ShowsPrec_6989586621680865285Sym1 a6989586621680865282 a6989586621679072585 :: TyFun (Product a6989586621679072585) (Symbol ~> Symbol) -> Type) (a6989586621680865283 :: Product a6989586621679072585) = ShowsPrec_6989586621680865285Sym2 a6989586621680865282 a6989586621680865283
type Apply (ShowsPrec_6989586621680280531Sym1 a6989586621680280528 a6989586621679055391 :: TyFun (NonEmpty a6989586621679055391) (Symbol ~> Symbol) -> Type) (a6989586621680280529 :: NonEmpty a6989586621679055391) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680280531Sym1 a6989586621680280528 a6989586621679055391 :: TyFun (NonEmpty a6989586621679055391) (Symbol ~> Symbol) -> Type) (a6989586621680280529 :: NonEmpty a6989586621679055391) = ShowsPrec_6989586621680280531Sym2 a6989586621680280528 a6989586621680280529
type Apply (ShowListWithSym0 :: TyFun (a6989586621680260309 ~> (Symbol ~> Symbol)) ([a6989586621680260309] ~> (Symbol ~> Symbol)) -> Type) (a6989586621680262247 :: a6989586621680260309 ~> (Symbol ~> Symbol)) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowListWithSym0 :: TyFun (a6989586621680260309 ~> (Symbol ~> Symbol)) ([a6989586621680260309] ~> (Symbol ~> Symbol)) -> Type) (a6989586621680262247 :: a6989586621680260309 ~> (Symbol ~> Symbol)) = ShowListWithSym1 a6989586621680262247
type Apply (ShowParenSym1 a6989586621680262215 :: TyFun (Symbol ~> Symbol) (Symbol ~> Symbol) -> Type) (a6989586621680262216 :: Symbol ~> Symbol) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowParenSym1 a6989586621680262215 :: TyFun (Symbol ~> Symbol) (Symbol ~> Symbol) -> Type) (a6989586621680262216 :: Symbol ~> Symbol) = ShowParenSym2 a6989586621680262215 a6989586621680262216
type Apply (Let6989586621680262258ShowlSym0 :: TyFun (k1 ~> (Symbol ~> Symbol)) (TyFun k2 (TyFun k3 (TyFun Symbol (TyFun [k1] Symbol -> Type) -> Type) -> Type) -> Type) -> Type) (showx6989586621680262254 :: k1 ~> (Symbol ~> Symbol)) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (Let6989586621680262258ShowlSym0 :: TyFun (k1 ~> (Symbol ~> Symbol)) (TyFun k2 (TyFun k3 (TyFun Symbol (TyFun [k1] Symbol -> Type) -> Type) -> Type) -> Type) -> Type) (showx6989586621680262254 :: k1 ~> (Symbol ~> Symbol)) = (Let6989586621680262258ShowlSym1 showx6989586621680262254 :: TyFun k2 (TyFun k3 (TyFun Symbol (TyFun [k1] Symbol -> Type) -> Type) -> Type) -> Type)
type Apply (ShowsPrec_6989586621680280497Sym1 a6989586621680280494 a6989586621679073691 b6989586621679073692 :: TyFun (Either a6989586621679073691 b6989586621679073692) (Symbol ~> Symbol) -> Type) (a6989586621680280495 :: Either a6989586621679073691 b6989586621679073692) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680280497Sym1 a6989586621680280494 a6989586621679073691 b6989586621679073692 :: TyFun (Either a6989586621679073691 b6989586621679073692) (Symbol ~> Symbol) -> Type) (a6989586621680280495 :: Either a6989586621679073691 b6989586621679073692) = ShowsPrec_6989586621680280497Sym2 a6989586621680280494 a6989586621680280495
type Apply (ShowsPrec_6989586621680262374Sym1 a6989586621680262371 a6989586621680260347 b6989586621680260348 :: TyFun (a6989586621680260347, b6989586621680260348) (Symbol ~> Symbol) -> Type) (a6989586621680262372 :: (a6989586621680260347, b6989586621680260348)) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680262374Sym1 a6989586621680262371 a6989586621680260347 b6989586621680260348 :: TyFun (a6989586621680260347, b6989586621680260348) (Symbol ~> Symbol) -> Type) (a6989586621680262372 :: (a6989586621680260347, b6989586621680260348)) = ShowsPrec_6989586621680262374Sym2 a6989586621680262371 a6989586621680262372
type Apply (ShowsPrec_6989586621680882596Sym1 a6989586621680882593 a6989586621680881245 b6989586621680881246 :: TyFun (Arg a6989586621680881245 b6989586621680881246) (Symbol ~> Symbol) -> Type) (a6989586621680882594 :: Arg a6989586621680881245 b6989586621680881246) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ShowsPrec_6989586621680882596Sym1 a6989586621680882593 a6989586621680881245 b6989586621680881246 :: TyFun (Arg a6989586621680881245 b6989586621680881246) (Symbol ~> Symbol) -> Type) (a6989586621680882594 :: Arg a6989586621680881245 b6989586621680881246) = ShowsPrec_6989586621680882596Sym2 a6989586621680882593 a6989586621680882594
type Apply (Lambda_6989586621680262237Sym2 a_69895866216802622336989586621680262236 ss6989586621680262235 :: TyFun (Symbol ~> c6989586621679519978) (TyFun (a6989586621679519979 ~> Symbol) (TyFun a6989586621679519979 c6989586621679519978 -> Type) -> Type) -> Type) (t6989586621680262241 :: Symbol ~> c6989586621679519978) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (Lambda_6989586621680262237Sym2 a_69895866216802622336989586621680262236 ss6989586621680262235 :: TyFun (Symbol ~> c6989586621679519978) (TyFun (a6989586621679519979 ~> Symbol) (TyFun a6989586621679519979 c6989586621679519978 -> Type) -> Type) -> Type) (t6989586621680262241 :: Symbol ~> c6989586621679519978) = (Lambda_6989586621680262237Sym3 a_69895866216802622336989586621680262236 ss6989586621680262235 t6989586621680262241 :: TyFun (a6989586621679519979 ~> Symbol) (TyFun a6989586621679519979 c6989586621679519978 -> Type) -> Type)
type Apply (Lambda_6989586621680262237Sym3 t6989586621680262241 a_69895866216802622336989586621680262236 ss6989586621680262235 :: TyFun (a6989586621679519979 ~> Symbol) (TyFun a6989586621679519979 c6989586621679519978 -> Type) -> Type) (t6989586621680262242 :: a6989586621679519979 ~> Symbol) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (Lambda_6989586621680262237Sym3 t6989586621680262241 a_69895866216802622336989586621680262236 ss6989586621680262235 :: TyFun (a6989586621679519979 ~> Symbol) (TyFun a6989586621679519979 c6989586621679519978 -> Type) -> Type) (t6989586621680262242 :: a6989586621679519979 ~> Symbol) = Lambda_6989586621680262237 t6989586621680262241 a_69895866216802622336989586621680262236 ss6989586621680262235 t6989586621680262242
type Apply (ShowsPrec_6989586621680262392Sym1 a6989586621680262389 a6989586621680260352 b6989586621680260353 c6989586621680260354 :: TyFun (a6989586621680260352, b6989586621680260353, c6989586621680260354) (Symbol ~> Symbol) -> Type) (a6989586621680262390 :: (a6989586621680260352, b6989586621680260353, c6989586621680260354)) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680262392Sym1 a6989586621680262389 a6989586621680260352 b6989586621680260353 c6989586621680260354 :: TyFun (a6989586621680260352, b6989586621680260353, c6989586621680260354) (Symbol ~> Symbol) -> Type) (a6989586621680262390 :: (a6989586621680260352, b6989586621680260353, c6989586621680260354)) = ShowsPrec_6989586621680262392Sym2 a6989586621680262389 a6989586621680262390
type Apply (ShowsPrec_6989586621680711151Sym1 a6989586621680711148 a6989586621680710532 b6989586621680710533 :: TyFun (Const a6989586621680710532 b6989586621680710533) (Symbol ~> Symbol) -> Type) (a6989586621680711149 :: Const a6989586621680710532 b6989586621680710533) 
Instance details

Defined in Data.Singletons.Prelude.Const

type Apply (ShowsPrec_6989586621680711151Sym1 a6989586621680711148 a6989586621680710532 b6989586621680710533 :: TyFun (Const a6989586621680710532 b6989586621680710533) (Symbol ~> Symbol) -> Type) (a6989586621680711149 :: Const a6989586621680710532 b6989586621680710533) = ShowsPrec_6989586621680711151Sym2 a6989586621680711148 a6989586621680711149
type Apply (ShowsPrec_6989586621680262411Sym1 a6989586621680262408 a6989586621680260359 b6989586621680260360 c6989586621680260361 d6989586621680260362 :: TyFun (a6989586621680260359, b6989586621680260360, c6989586621680260361, d6989586621680260362) (Symbol ~> Symbol) -> Type) (a6989586621680262409 :: (a6989586621680260359, b6989586621680260360, c6989586621680260361, d6989586621680260362)) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680262411Sym1 a6989586621680262408 a6989586621680260359 b6989586621680260360 c6989586621680260361 d6989586621680260362 :: TyFun (a6989586621680260359, b6989586621680260360, c6989586621680260361, d6989586621680260362) (Symbol ~> Symbol) -> Type) (a6989586621680262409 :: (a6989586621680260359, b6989586621680260360, c6989586621680260361, d6989586621680260362)) = ShowsPrec_6989586621680262411Sym2 a6989586621680262408 a6989586621680262409
type Apply (ShowsPrec_6989586621680262431Sym1 a6989586621680262428 a6989586621680260368 b6989586621680260369 c6989586621680260370 d6989586621680260371 e6989586621680260372 :: TyFun (a6989586621680260368, b6989586621680260369, c6989586621680260370, d6989586621680260371, e6989586621680260372) (Symbol ~> Symbol) -> Type) (a6989586621680262429 :: (a6989586621680260368, b6989586621680260369, c6989586621680260370, d6989586621680260371, e6989586621680260372)) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680262431Sym1 a6989586621680262428 a6989586621680260368 b6989586621680260369 c6989586621680260370 d6989586621680260371 e6989586621680260372 :: TyFun (a6989586621680260368, b6989586621680260369, c6989586621680260370, d6989586621680260371, e6989586621680260372) (Symbol ~> Symbol) -> Type) (a6989586621680262429 :: (a6989586621680260368, b6989586621680260369, c6989586621680260370, d6989586621680260371, e6989586621680260372)) = ShowsPrec_6989586621680262431Sym2 a6989586621680262428 a6989586621680262429
type Apply (ShowsPrec_6989586621680262452Sym1 a6989586621680262449 a6989586621680260379 b6989586621680260380 c6989586621680260381 d6989586621680260382 e6989586621680260383 f6989586621680260384 :: TyFun (a6989586621680260379, b6989586621680260380, c6989586621680260381, d6989586621680260382, e6989586621680260383, f6989586621680260384) (Symbol ~> Symbol) -> Type) (a6989586621680262450 :: (a6989586621680260379, b6989586621680260380, c6989586621680260381, d6989586621680260382, e6989586621680260383, f6989586621680260384)) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680262452Sym1 a6989586621680262449 a6989586621680260379 b6989586621680260380 c6989586621680260381 d6989586621680260382 e6989586621680260383 f6989586621680260384 :: TyFun (a6989586621680260379, b6989586621680260380, c6989586621680260381, d6989586621680260382, e6989586621680260383, f6989586621680260384) (Symbol ~> Symbol) -> Type) (a6989586621680262450 :: (a6989586621680260379, b6989586621680260380, c6989586621680260381, d6989586621680260382, e6989586621680260383, f6989586621680260384)) = ShowsPrec_6989586621680262452Sym2 a6989586621680262449 a6989586621680262450
type Apply (ShowsPrec_6989586621680262474Sym1 a6989586621680262471 a6989586621680260392 b6989586621680260393 c6989586621680260394 d6989586621680260395 e6989586621680260396 f6989586621680260397 g6989586621680260398 :: TyFun (a6989586621680260392, b6989586621680260393, c6989586621680260394, d6989586621680260395, e6989586621680260396, f6989586621680260397, g6989586621680260398) (Symbol ~> Symbol) -> Type) (a6989586621680262472 :: (a6989586621680260392, b6989586621680260393, c6989586621680260394, d6989586621680260395, e6989586621680260396, f6989586621680260397, g6989586621680260398)) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680262474Sym1 a6989586621680262471 a6989586621680260392 b6989586621680260393 c6989586621680260394 d6989586621680260395 e6989586621680260396 f6989586621680260397 g6989586621680260398 :: TyFun (a6989586621680260392, b6989586621680260393, c6989586621680260394, d6989586621680260395, e6989586621680260396, f6989586621680260397, g6989586621680260398) (Symbol ~> Symbol) -> Type) (a6989586621680262472 :: (a6989586621680260392, b6989586621680260393, c6989586621680260394, d6989586621680260395, e6989586621680260396, f6989586621680260397, g6989586621680260398)) = ShowsPrec_6989586621680262474Sym2 a6989586621680262471 a6989586621680262472
type Apply (FromString_6989586621681196292Sym0 :: TyFun Symbol (Const a6989586621681196252 b6989586621681196253) -> Type) (a6989586621681196291 :: Symbol) 
Instance details

Defined in Data.Singletons.Prelude.IsString

type Apply (FromString_6989586621681196292Sym0 :: TyFun Symbol (Const a6989586621681196252 b6989586621681196253) -> Type) (a6989586621681196291 :: Symbol) = (FromString_6989586621681196292 a6989586621681196291 :: Const a6989586621681196252 b6989586621681196253)

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

Addition of type-level naturals.

Since: base-4.7.0.0

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

Multiplication of type-level naturals.

Since: base-4.7.0.0

type family (a :: Nat) ^ (b :: Nat) :: Nat where ... infixr 8 #

Exponentiation of type-level naturals.

Since: base-4.7.0.0

type family (a :: Nat) <=? (b :: Nat) :: Bool where ... infix 4 #

Comparison of type-level naturals, as a function. NOTE: The functionality for this function should be subsumed by CmpNat, so this might go away in the future. Please let us know, if you encounter discrepancies between the two.

type family (a :: Nat) - (b :: Nat) :: Nat where ... infixl 6 #

Subtraction of type-level naturals.

Since: base-4.7.0.0

type family CmpSymbol (a :: Symbol) (b :: Symbol) :: Ordering where ... #

Comparison of type-level symbols, as a function.

Since: base-4.7.0.0

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

Comparison of type-level naturals, as a function.

Since: base-4.7.0.0

type family Div (a :: Nat) (b :: Nat) :: Nat where ... infixl 7 #

Division (round down) of natural numbers. Div x 0 is undefined (i.e., it cannot be reduced).

Since: base-4.11.0.0

type family Mod (a :: Nat) (b :: Nat) :: Nat where ... infixl 7 #

Modulus of natural numbers. Mod x 0 is undefined (i.e., it cannot be reduced).

Since: base-4.11.0.0

type family Log2 (a :: Nat) :: Nat where ... #

Log base 2 (round down) of natural numbers. Log 0 is undefined (i.e., it cannot be reduced).

Since: base-4.11.0.0

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

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

Concatenation of type-level symbols.

Since: base-4.10.0.0

errorBadArgument :: a #

Calls perror to indicate that there is a type error or similar in the given argument.

Since: base-4.7.0.0

errorMissingArgument :: a #

Calls perror to indicate that there is a missing argument in the argument list.

Since: base-4.7.0.0

errorShortFormat :: a #

Calls perror to indicate that the format string ended early.

Since: base-4.7.0.0

errorBadFormat :: Char -> a #

Calls perror to indicate an unknown format letter for a given type.

Since: base-4.7.0.0

perror :: String -> a #

Raises an error with a printf-specific prefix on the message string.

Since: base-4.7.0.0

formatRealFloat :: RealFloat a => a -> FieldFormatter #

Formatter for RealFloat values.

Since: base-4.7.0.0

formatInteger :: Integer -> FieldFormatter #

Formatter for Integer values.

Since: base-4.7.0.0

formatInt :: (Integral a, Bounded a) => a -> FieldFormatter #

Formatter for Int values.

Since: base-4.7.0.0

formatString :: IsChar a => [a] -> FieldFormatter #

Formatter for String values.

Since: base-4.7.0.0

formatChar :: Char -> FieldFormatter #

Formatter for Char values.

Since: base-4.7.0.0

vFmt :: Char -> FieldFormat -> FieldFormat #

Substitute a 'v' format character with the given default format character in the FieldFormat. A convenience for user-implemented types, which should support "%v".

Since: base-4.7.0.0

hPrintf :: HPrintfType r => Handle -> String -> r #

Similar to printf, except that output is via the specified Handle. The return type is restricted to (IO a).

printf :: PrintfType r => String -> r #

Format a variable number of arguments with the C-style formatting string.

>>> printf "%s, %d, %.4f" "hello" 123 pi
hello, 123, 3.1416

The return value is either String or (IO a) (which should be (IO '()'), but Haskell's type system makes this hard).

The format string consists of ordinary characters and conversion specifications, which specify how to format one of the arguments to printf in the output string. A format specification is introduced by the % character; this character can be self-escaped into the format string using %%. A format specification ends with a /format character/ that provides the primary information about how to format the value. The rest of the conversion specification is optional. In order, one may have flag characters, a width specifier, a precision specifier, and type-specific modifier characters.

Unlike C printf(3), the formatting of this printf is driven by the argument type; formatting is type specific. The types formatted by printf "out of the box" are:

printf is also extensible to support other types: see below.

A conversion specification begins with the character %, followed by zero or more of the following flags:

-      left adjust (default is right adjust)
+      always use a sign (+ or -) for signed conversions
space  leading space for positive numbers in signed conversions
0      pad with zeros rather than spaces
#      use an \"alternate form\": see below

When both flags are given, - overrides 0 and + overrides space. A negative width specifier in a * conversion is treated as positive but implies the left adjust flag.

The "alternate form" for unsigned radix conversions is as in C printf(3):

%o           prefix with a leading 0 if needed
%x           prefix with a leading 0x if nonzero
%X           prefix with a leading 0X if nonzero
%b           prefix with a leading 0b if nonzero
%[eEfFgG]    ensure that the number contains a decimal point

Any flags are followed optionally by a field width:

num    field width
*      as num, but taken from argument list

The field width is a minimum, not a maximum: it will be expanded as needed to avoid mutilating a value.

Any field width is followed optionally by a precision:

.num   precision
.      same as .0
.*     as num, but taken from argument list

Negative precision is taken as 0. The meaning of the precision depends on the conversion type.

Integral    minimum number of digits to show
RealFloat   number of digits after the decimal point
String      maximum number of characters

The precision for Integral types is accomplished by zero-padding. If both precision and zero-pad are given for an Integral field, the zero-pad is ignored.

Any precision is followed optionally for Integral types by a width modifier; the only use of this modifier being to set the implicit size of the operand for conversion of a negative operand to unsigned:

hh     Int8
h      Int16
l      Int32
ll     Int64
L      Int64

The specification ends with a format character:

c      character               Integral
d      decimal                 Integral
o      octal                   Integral
x      hexadecimal             Integral
X      hexadecimal             Integral
b      binary                  Integral
u      unsigned decimal        Integral
f      floating point          RealFloat
F      floating point          RealFloat
g      general format float    RealFloat
G      general format float    RealFloat
e      exponent format float   RealFloat
E      exponent format float   RealFloat
s      string                  String
v      default format          any type

The "%v" specifier is provided for all built-in types, and should be provided for user-defined type formatters as well. It picks a "best" representation for the given type. For the built-in types the "%v" specifier is converted as follows:

c      Char
u      other unsigned Integral
d      other signed Integral
g      RealFloat
s      String

Mismatch between the argument types and the format string, as well as any other syntactic or semantic errors in the format string, will cause an exception to be thrown at runtime.

Note that the formatting for RealFloat types is currently a bit different from that of C printf(3), conforming instead to showEFloat, showFFloat and showGFloat (and their alternate versions showFFloatAlt and showGFloatAlt). This is hard to fix: the fixed versions would format in a backward-incompatible way. In any case the Haskell behavior is generally more sensible than the C behavior. A brief summary of some key differences:

  • Haskell printf never uses the default "6-digit" precision used by C printf.
  • Haskell printf treats the "precision" specifier as indicating the number of digits after the decimal point.
  • Haskell printf prints the exponent of e-format numbers without a gratuitous plus sign, and with the minimum possible number of digits.
  • Haskell printf will place a zero after a decimal point when possible.

class PrintfType t #

The PrintfType class provides the variable argument magic for printf. Its implementation is intentionally not visible from this module. If you attempt to pass an argument of a type which is not an instance of this class to printf or hPrintf, then the compiler will report it as a missing instance of PrintfArg.

Minimal complete definition

spr

Instances
IsChar c => PrintfType [c]

Since: base-2.1

Instance details

Defined in Text.Printf

Methods

spr :: String -> [UPrintf] -> [c]

a ~ () => PrintfType (IO a)

Since: base-4.7.0.0

Instance details

Defined in Text.Printf

Methods

spr :: String -> [UPrintf] -> IO a

(PrintfArg a, PrintfType r) => PrintfType (a -> r)

Since: base-2.1

Instance details

Defined in Text.Printf

Methods

spr :: String -> [UPrintf] -> a -> r

class HPrintfType t #

The HPrintfType class provides the variable argument magic for hPrintf. Its implementation is intentionally not visible from this module.

Minimal complete definition

hspr

Instances
a ~ () => HPrintfType (IO a)

Since: base-4.7.0.0

Instance details

Defined in Text.Printf

Methods

hspr :: Handle -> String -> [UPrintf] -> IO a

(PrintfArg a, HPrintfType r) => HPrintfType (a -> r)

Since: base-2.1

Instance details

Defined in Text.Printf

Methods

hspr :: Handle -> String -> [UPrintf] -> a -> r

class PrintfArg a where #

Typeclass of printf-formattable values. The formatArg method takes a value and a field format descriptor and either fails due to a bad descriptor or produces a ShowS as the result. The default parseFormat expects no modifiers: this is the normal case. Minimal instance: formatArg.

Minimal complete definition

formatArg

Methods

formatArg :: a -> FieldFormatter #

Since: base-4.7.0.0

parseFormat :: a -> ModifierParser #

Since: base-4.7.0.0

Instances
PrintfArg Char

Since: base-2.1

Instance details

Defined in Text.Printf

PrintfArg Double

Since: base-2.1

Instance details

Defined in Text.Printf

PrintfArg Float

Since: base-2.1

Instance details

Defined in Text.Printf

PrintfArg Int

Since: base-2.1

Instance details

Defined in Text.Printf

PrintfArg Int8

Since: base-2.1

Instance details

Defined in Text.Printf

PrintfArg Int16

Since: base-2.1

Instance details

Defined in Text.Printf

PrintfArg Int32

Since: base-2.1

Instance details

Defined in Text.Printf

PrintfArg Int64

Since: base-2.1

Instance details

Defined in Text.Printf

PrintfArg Integer

Since: base-2.1

Instance details

Defined in Text.Printf

PrintfArg Natural

Since: base-4.8.0.0

Instance details

Defined in Text.Printf

PrintfArg Word

Since: base-2.1

Instance details

Defined in Text.Printf

PrintfArg Word8

Since: base-2.1

Instance details

Defined in Text.Printf

PrintfArg Word16

Since: base-2.1

Instance details

Defined in Text.Printf

PrintfArg Word32

Since: base-2.1

Instance details

Defined in Text.Printf

PrintfArg Word64

Since: base-2.1

Instance details

Defined in Text.Printf

IsChar c => PrintfArg [c]

Since: base-2.1

Instance details

Defined in Text.Printf

(PrintfArg Word64, n <= 64) => PrintfArg (B n) Source # 
Instance details

Defined in Data.Type.BitRecords.Core

class IsChar c where #

This class, with only the one instance, is used as a workaround for the fact that String, as a concrete type, is not allowable as a typeclass instance. IsChar is exported for backward-compatibility.

Methods

toChar :: c -> Char #

Since: base-4.7.0.0

fromChar :: Char -> c #

Since: base-4.7.0.0

Instances
IsChar Char

Since: base-2.1

Instance details

Defined in Text.Printf

Methods

toChar :: Char -> Char #

fromChar :: Char -> Char #

data FormatAdjustment #

Whether to left-adjust or zero-pad a field. These are mutually exclusive, with LeftAdjust taking precedence.

Since: base-4.7.0.0

Constructors

LeftAdjust 
ZeroPad 

data FormatSign #

How to handle the sign of a numeric field. These are mutually exclusive, with SignPlus taking precedence.

Since: base-4.7.0.0

Constructors

SignPlus 
SignSpace 

data FieldFormat #

Description of field formatting for formatArg. See UNIX printf(3) for a description of how field formatting works.

Since: base-4.7.0.0

Constructors

FieldFormat 

Fields

data FormatParse #

The "format parser" walks over argument-type-specific modifier characters to find the primary format character. This is the type of its result.

Since: base-4.7.0.0

Constructors

FormatParse 

Fields

type FieldFormatter = FieldFormat -> ShowS #

This is the type of a field formatter reified over its argument.

Since: base-4.7.0.0

type ModifierParser = String -> FormatParse #

Type of a function that will parse modifier characters from the format string.

Since: base-4.7.0.0

traceMarkerIO :: String -> IO () #

The traceMarkerIO function emits a marker to the eventlog, if eventlog profiling is available and enabled at runtime.

Compared to traceMarker, traceMarkerIO sequences the event with respect to other IO actions.

Since: base-4.7.0.0

traceMarker :: String -> a -> a #

The traceMarker function emits a marker to the eventlog, if eventlog profiling is available and enabled at runtime. The String is the name of the marker. The name is just used in the profiling tools to help you keep clear which marker is which.

This function is suitable for use in pure code. In an IO context use traceMarkerIO instead.

Note that when using GHC's SMP runtime, it is possible (but rare) to get duplicate events emitted if two CPUs simultaneously evaluate the same thunk that uses traceMarker.

Since: base-4.7.0.0

traceEventIO :: String -> IO () #

The traceEventIO function emits a message to the eventlog, if eventlog profiling is available and enabled at runtime.

Compared to traceEvent, traceEventIO sequences the event with respect to other IO actions.

Since: base-4.5.0.0

traceEvent :: String -> a -> a #

The traceEvent function behaves like trace with the difference that the message is emitted to the eventlog, if eventlog profiling is available and enabled at runtime.

It is suitable for use in pure code. In an IO context use traceEventIO instead.

Note that when using GHC's SMP runtime, it is possible (but rare) to get duplicate events emitted if two CPUs simultaneously evaluate the same thunk that uses traceEvent.

Since: base-4.5.0.0

traceStack :: String -> a -> a #

like trace, but additionally prints a call stack if one is available.

In the current GHC implementation, the call stack is only available if the program was compiled with -prof; otherwise traceStack behaves exactly like trace. Entries in the call stack correspond to SCC annotations, so it is a good idea to use -fprof-auto or -fprof-auto-calls to add SCC annotations automatically.

Since: base-4.5.0.0

traceShowM :: (Show a, Applicative f) => a -> f () #

Like traceM, but uses show on the argument to convert it to a String.

>>> :{
do
    x <- Just 3
    traceShowM x
    y <- pure 12
    traceShowM y
    pure (x*2 + y)
:}
3
12
Just 18

Since: base-4.7.0.0

traceM :: Applicative f => String -> f () #

Like trace but returning unit in an arbitrary Applicative context. Allows for convenient use in do-notation.

Note that the application of traceM is not an action in the Applicative context, as traceIO is in the IO type. While the fresh bindings in the following example will force the traceM expressions to be reduced every time the do-block is executed, traceM "not crashed" would only be reduced once, and the message would only be printed once. If your monad is in MonadIO, liftIO . traceIO may be a better option.

>>> :{
do
    x <- Just 3
    traceM ("x: " ++ show x)
    y <- pure 12
    traceM ("y: " ++ show y)
    pure (x*2 + y)
:}
x: 3
y: 12
Just 18

Since: base-4.7.0.0

traceShowId :: Show a => a -> a #

Like traceShow but returns the shown value instead of a third value.

>>> traceShowId (1+2+3, "hello" ++ "world")
(6,"helloworld")
(6,"helloworld")

Since: base-4.7.0.0

traceShow :: Show a => a -> b -> b #

Like trace, but uses show on the argument to convert it to a String.

This makes it convenient for printing the values of interesting variables or expressions inside a function. For example here we print the value of the variables x and y:

>>> let f x y = traceShow (x,y) (x + y) in f (1+2) 5
(3,5)
8

traceId :: String -> String #

Like trace but returns the message instead of a third value.

>>> traceId "hello"
"hello
hello"

Since: base-4.7.0.0

putTraceMsg :: String -> IO () #

 

traceIO :: String -> IO () #

The traceIO function outputs the trace message from the IO monad. This sequences the output with respect to other IO actions.

Since: base-4.5.0.0

newtype First a #

Maybe monoid returning the leftmost non-Nothing value.

First a is isomorphic to Alt Maybe a, but precedes it historically.

>>> getFirst (First (Just "hello") <> First Nothing <> First (Just "world"))
Just "hello"

Use of this type is discouraged. Note the following equivalence:

Data.Monoid.First x === Maybe (Data.Semigroup.First x)

In addition to being equivalent in the structural sense, the two also have Monoid instances that behave the same. This type will be marked deprecated in GHC 8.8, and removed in GHC 8.10. Users are advised to use the variant from Data.Semigroup and wrap it in Maybe.

Constructors

First 

Fields

Instances
Monad First

Since: base-4.8.0.0

Instance details

Defined in Data.Monoid

Methods

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

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

return :: a -> First a #

fail :: String -> First a #

Functor First

Since: base-4.8.0.0

Instance details

Defined in Data.Monoid

Methods

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

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

Applicative First

Since: base-4.8.0.0

Instance details

Defined in Data.Monoid

Methods

pure :: a -> First a #

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

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

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

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

Foldable First

Since: base-4.8.0.0

Instance details

Defined in Data.Foldable

Methods

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

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

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

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

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

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

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

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

toList :: First a -> [a] #

null :: First a -> Bool #

length :: First a -> Int #

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

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

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

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

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

Traversable First

Since: base-4.8.0.0

Instance details

Defined in Data.Traversable

Methods

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

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

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

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

PTraversable First 
Instance details

Defined in Data.Singletons.Prelude.Traversable

Associated Types

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

type SequenceA arg :: f (t a) #

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

type Sequence arg :: m (t a) #

STraversable First 
Instance details

Defined in Data.Singletons.Prelude.Traversable

Methods

sTraverse :: SApplicative f => Sing t1 -> Sing t2 -> Sing (Apply (Apply TraverseSym0 t1) t2) #

sSequenceA :: SApplicative f => Sing t1 -> Sing (Apply SequenceASym0 t1) #

sMapM :: SMonad m => Sing t1 -> Sing t2 -> Sing (Apply (Apply MapMSym0 t1) t2) #

sSequence :: SMonad m => Sing t1 -> Sing (Apply SequenceSym0 t1) #

PFoldable First 
Instance details

Defined in Data.Singletons.Prelude.Foldable

Associated Types

type Fold arg :: m #

type FoldMap arg arg1 :: m #

type Foldr arg arg1 arg2 :: b #

type Foldr' arg arg1 arg2 :: b #

type Foldl arg arg1 arg2 :: b #

type Foldl' arg arg1 arg2 :: b #

type Foldr1 arg arg1 :: a #

type Foldl1 arg arg1 :: a #

type ToList arg :: [a] #

type Null arg :: Bool #

type Length arg :: Nat #

type Elem arg arg1 :: Bool #

type Maximum arg :: a #

type Minimum arg :: a #

type Sum arg :: a #

type Product arg :: a #

SFoldable First 
Instance details

Defined in Data.Singletons.Prelude.Foldable

Methods

sFold :: SMonoid m => Sing t1 -> Sing (Apply FoldSym0 t1) #

sFoldMap :: SMonoid m => Sing t1 -> Sing t2 -> Sing (Apply (Apply FoldMapSym0 t1) t2) #

sFoldr :: Sing t1 -> Sing t2 -> Sing t3 -> Sing (Apply (Apply (Apply FoldrSym0 t1) t2) t3) #

sFoldr' :: Sing t1 -> Sing t2 -> Sing t3 -> Sing (Apply (Apply (Apply Foldr'Sym0 t1) t2) t3) #

sFoldl :: Sing t1 -> Sing t2 -> Sing t3 -> Sing (Apply (Apply (Apply FoldlSym0 t1) t2) t3) #

sFoldl' :: Sing t1 -> Sing t2 -> Sing t3 -> Sing (Apply (Apply (Apply Foldl'Sym0 t1) t2) t3) #

sFoldr1 :: Sing t1 -> Sing t2 -> Sing (Apply (Apply Foldr1Sym0 t1) t2) #

sFoldl1 :: Sing t1 -> Sing t2 -> Sing (Apply (Apply Foldl1Sym0 t1) t2) #

sToList :: Sing t1 -> Sing (Apply ToListSym0 t1) #

sNull :: Sing t1 -> Sing (Apply NullSym0 t1) #

sLength :: Sing t1 -> Sing (Apply LengthSym0 t1) #

sElem :: SEq a => Sing t1 -> Sing t2 -> Sing (Apply (Apply ElemSym0 t1) t2) #

sMaximum :: SOrd a => Sing t1 -> Sing (Apply MaximumSym0 t1) #

sMinimum :: SOrd a => Sing t1 -> Sing (Apply MinimumSym0 t1) #

sSum :: SNum a => Sing t1 -> Sing (Apply SumSym0 t1) #

sProduct :: SNum a => Sing t1 -> Sing (Apply ProductSym0 t1) #

Eq a => Eq (First a)

Since: base-2.1

Instance details

Defined in Data.Monoid

Methods

(==) :: First a -> First a -> Bool #

(/=) :: First a -> First a -> Bool #

Ord a => Ord (First a)

Since: base-2.1

Instance details

Defined in Data.Monoid

Methods

compare :: First a -> First a -> Ordering #

(<) :: First a -> First a -> Bool #

(<=) :: First a -> First a -> Bool #

(>) :: First a -> First a -> Bool #

(>=) :: First a -> First a -> Bool #

max :: First a -> First a -> First a #

min :: First a -> First a -> First a #

Read a => Read (First a)

Since: base-2.1

Instance details

Defined in Data.Monoid

Show a => Show (First a)

Since: base-2.1

Instance details

Defined in Data.Monoid

Methods

showsPrec :: Int -> First a -> ShowS #

show :: First a -> String #

showList :: [First a] -> ShowS #

Generic (First a) 
Instance details

Defined in Data.Monoid

Associated Types

type Rep (First a) :: Type -> Type #

Methods

from :: First a -> Rep (First a) x #

to :: Rep (First a) x -> First a #

Semigroup (First a)

Since: base-4.9.0.0

Instance details

Defined in Data.Monoid

Methods

(<>) :: First a -> First a -> First a #

sconcat :: NonEmpty (First a) -> First a #

stimes :: Integral b => b -> First a -> First a #

Monoid (First a)

Since: base-2.1

Instance details

Defined in Data.Monoid

Methods

mempty :: First a #

mappend :: First a -> First a -> First a #

mconcat :: [First a] -> First a #

Default (First a) 
Instance details

Defined in Data.Default.Class

Methods

def :: First a #

PMonoid (First a) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

Associated Types

type Mempty :: a #

type Mappend arg arg1 :: a #

type Mconcat arg :: a #

SMonoid (First a) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

Generic1 First 
Instance details

Defined in Data.Monoid

Associated Types

type Rep1 First :: k -> Type #

Methods

from1 :: First a -> Rep1 First a #

to1 :: Rep1 First a -> First a #

SuppressUnusedWarnings (FirstSym0 :: TyFun (Maybe a6989586621679072624) (First a6989586621679072624) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

SuppressUnusedWarnings (ShowsPrec_6989586621680335234Sym0 :: TyFun Nat (First a6989586621679072624 ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

SuppressUnusedWarnings (Pure_6989586621680338357Sym0 :: TyFun a6989586621679544265 (First a6989586621679544265) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

SuppressUnusedWarnings (Let6989586621680338429ASym0 :: TyFun a6989586621679072624 (First a6989586621679072624) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

SuppressUnusedWarnings (TFHelper_6989586621680338433Sym0 :: TyFun (First a6989586621680338189) (First a6989586621680338189 ~> First a6989586621680338189) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

SuppressUnusedWarnings (GetFirstSym0 :: TyFun (First a6989586621679072624) (Maybe a6989586621679072624) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

SuppressUnusedWarnings (Compare_6989586621680333949Sym0 :: TyFun (First a6989586621679072624) (First a6989586621679072624 ~> Ordering) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

SingI (FirstSym0 :: TyFun (Maybe a) (First a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

Methods

sing :: Sing FirstSym0 #

SuppressUnusedWarnings (TFHelper_6989586621680338392Sym0 :: TyFun a6989586621679544262 (First b6989586621679544263 ~> First a6989586621679544262) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

SuppressUnusedWarnings (TFHelper_6989586621680338433Sym1 a6989586621680338431 :: TyFun (First a6989586621680338189) (First a6989586621680338189) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

SuppressUnusedWarnings (TFHelper_6989586621680338419Sym0 :: TyFun (First a6989586621679544289) ((a6989586621679544289 ~> First b6989586621679544290) ~> First b6989586621679544290) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

SuppressUnusedWarnings (ShowsPrec_6989586621680335234Sym1 a6989586621680335231 a6989586621679072624 :: TyFun (First a6989586621679072624) (Symbol ~> Symbol) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

SuppressUnusedWarnings (Compare_6989586621680333949Sym1 a6989586621680333947 :: TyFun (First a6989586621679072624) Ordering -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

SuppressUnusedWarnings (TFHelper_6989586621680338368Sym0 :: TyFun (First (a6989586621679544266 ~> b6989586621679544267)) (First a6989586621679544266 ~> First b6989586621679544267) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

SuppressUnusedWarnings (Let6989586621680450690Scrutinee_6989586621680450577Sym0 :: TyFun (a6989586621680450321 ~> Bool) (TyFun (t6989586621680450318 a6989586621680450321) (First a6989586621680450321) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (Lambda_6989586621680450691Sym0 :: TyFun (a6989586621679072624 ~> Bool) (TyFun k (TyFun a6989586621679072624 (First a6989586621679072624) -> Type) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (Foldr_6989586621680532713Sym0 :: TyFun (a6989586621680450322 ~> (b6989586621680450323 ~> b6989586621680450323)) (b6989586621680450323 ~> (First a6989586621680450322 ~> b6989586621680450323)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (FoldMap_6989586621680532686Sym0 :: TyFun (a6989586621680450321 ~> m6989586621680450320) (First a6989586621680450321 ~> m6989586621680450320) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (Fmap_6989586621680338380Sym0 :: TyFun (a6989586621679544260 ~> b6989586621679544261) (First a6989586621679544260 ~> First b6989586621679544261) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

SuppressUnusedWarnings (Let6989586621680450690Scrutinee_6989586621680450577Sym1 p6989586621680450688 :: TyFun (t6989586621680450318 a6989586621680450321) (First a6989586621680450321) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (Lambda_6989586621680450691Sym1 p6989586621680450688 :: TyFun k (TyFun a6989586621679072624 (First a6989586621679072624) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (Foldr_6989586621680532713Sym1 a6989586621680532710 :: TyFun b6989586621680450323 (First a6989586621680450322 ~> b6989586621680450323) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (Lambda_6989586621680338402Sym0 :: TyFun k (TyFun (k1 ~> First a) (TyFun k1 (Maybe a) -> Type) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

SuppressUnusedWarnings (FoldMap_6989586621680532686Sym1 a6989586621680532684 :: TyFun (First a6989586621680450321) m6989586621680450320 -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (TFHelper_6989586621680338392Sym1 a6989586621680338390 b6989586621679544263 :: TyFun (First b6989586621679544263) (First a6989586621679544262) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

SuppressUnusedWarnings (TFHelper_6989586621680338368Sym1 a6989586621680338366 :: TyFun (First a6989586621679544266) (First b6989586621679544267) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

SuppressUnusedWarnings (Fmap_6989586621680338380Sym1 a6989586621680338378 :: TyFun (First a6989586621679544260) (First b6989586621679544261) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

SuppressUnusedWarnings (Traverse_6989586621680754107Sym0 :: TyFun (a6989586621680747832 ~> f6989586621680747831 b6989586621680747833) (First a6989586621680747832 ~> f6989586621680747831 (First b6989586621680747833)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

SuppressUnusedWarnings (TFHelper_6989586621680338419Sym1 a6989586621680338417 b6989586621679544290 :: TyFun (a6989586621679544289 ~> First b6989586621679544290) (First b6989586621679544290) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

SuppressUnusedWarnings (Lambda_6989586621680450691Sym2 y6989586621680450689 p6989586621680450688 :: TyFun a6989586621679072624 (First a6989586621679072624) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (Traverse_6989586621680754107Sym1 a6989586621680754105 :: TyFun (First a6989586621680747832) (f6989586621680747831 (First b6989586621680747833)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

SuppressUnusedWarnings (Foldr_6989586621680532713Sym2 a6989586621680532711 a6989586621680532710 :: TyFun (First a6989586621680450322) b6989586621680450323 -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (Lambda_6989586621680338402Sym1 a6989586621680338400 :: TyFun (k1 ~> First a) (TyFun k1 (Maybe a) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Product (arg :: First a) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Product (arg :: First a) = Apply (Product_6989586621680451297Sym0 :: TyFun (First a) a -> Type) arg
type Sum (arg :: First a) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Sum (arg :: First a) = Apply (Sum_6989586621680451284Sym0 :: TyFun (First a) a -> Type) arg
type Minimum (arg :: First a) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

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

Defined in Data.Singletons.Prelude.Foldable

type Maximum (arg :: First a) = Apply (Maximum_6989586621680451258Sym0 :: TyFun (First a) a -> Type) arg
type Length (arg :: First a) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Length (arg :: First a) = Apply (Length_6989586621680451229Sym0 :: TyFun (First a) Nat -> Type) arg
type Null (arg :: First a) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Null (arg :: First a) = Apply (Null_6989586621680451207Sym0 :: TyFun (First a) Bool -> Type) arg
type ToList (arg :: First a) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type ToList (arg :: First a) = Apply (ToList_6989586621680451186Sym0 :: TyFun (First a) [a] -> Type) arg
type Fold (arg :: First m) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Fold (arg :: First m) = Apply (Fold_6989586621680451003Sym0 :: TyFun (First m) m -> Type) arg
type Pure (a :: k1) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Pure (a :: k1) = Apply (Pure_6989586621680338357Sym0 :: TyFun k1 (First k1) -> Type) a
type Fail arg 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Fail arg = Apply (Fail_6989586621679544807Sym0 :: TyFun Symbol (First a) -> Type) arg
type Return (arg :: a) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Return (arg :: a) = Apply (Return_6989586621679544800Sym0 :: TyFun a (First a) -> Type) arg
type Sequence (arg :: First (m a)) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type Sequence (arg :: First (m a)) = Apply (Sequence_6989586621680747899Sym0 :: TyFun (First (m a)) (m (First a)) -> Type) arg
type SequenceA (arg :: First (f a)) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type SequenceA (arg :: First (f a)) = Apply (SequenceA_6989586621680747874Sym0 :: TyFun (First (f a)) (f (First a)) -> Type) arg
type Elem (arg1 :: a) (arg2 :: First a) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Elem (arg1 :: a) (arg2 :: First a) = Apply (Apply (Elem_6989586621680451244Sym0 :: TyFun a (First a ~> Bool) -> Type) arg1) arg2
type Foldl1 (arg1 :: a ~> (a ~> a)) (arg2 :: First a) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Foldl1 (arg1 :: a ~> (a ~> a)) (arg2 :: First a) = Apply (Apply (Foldl1_6989586621680451176Sym0 :: TyFun (a ~> (a ~> a)) (First a ~> a) -> Type) arg1) arg2
type Foldr1 (arg1 :: a ~> (a ~> a)) (arg2 :: First a) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Foldr1 (arg1 :: a ~> (a ~> a)) (arg2 :: First a) = Apply (Apply (Foldr1_6989586621680451151Sym0 :: TyFun (a ~> (a ~> a)) (First a ~> a) -> Type) arg1) arg2
type FoldMap (a1 :: a6989586621680450321 ~> k2) (a2 :: First a6989586621680450321) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type FoldMap (a1 :: a6989586621680450321 ~> k2) (a2 :: First a6989586621680450321) = Apply (Apply (FoldMap_6989586621680532686Sym0 :: TyFun (a6989586621680450321 ~> k2) (First a6989586621680450321 ~> k2) -> Type) a1) a2
type (a1 :: k1) <$ (a2 :: First b6989586621679544263) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type (a1 :: k1) <$ (a2 :: First b6989586621679544263) = Apply (Apply (TFHelper_6989586621680338392Sym0 :: TyFun k1 (First b6989586621679544263 ~> First k1) -> Type) a1) a2
type Fmap (a1 :: a6989586621679544260 ~> b6989586621679544261) (a2 :: First a6989586621679544260) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Fmap (a1 :: a6989586621679544260 ~> b6989586621679544261) (a2 :: First a6989586621679544260) = Apply (Apply (Fmap_6989586621680338380Sym0 :: TyFun (a6989586621679544260 ~> b6989586621679544261) (First a6989586621679544260 ~> First b6989586621679544261) -> Type) a1) a2
type (arg1 :: First a) <* (arg2 :: First b) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

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

Defined in Data.Singletons.Prelude.Monoid

type (arg1 :: First a) *> (arg2 :: First b) = Apply (Apply (TFHelper_6989586621679544740Sym0 :: TyFun (First a) (First b ~> First b) -> Type) arg1) arg2
type (a1 :: First (a6989586621679544266 ~> b6989586621679544267)) <*> (a2 :: First a6989586621679544266) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type (a1 :: First (a6989586621679544266 ~> b6989586621679544267)) <*> (a2 :: First a6989586621679544266) = Apply (Apply (TFHelper_6989586621680338368Sym0 :: TyFun (First (a6989586621679544266 ~> b6989586621679544267)) (First a6989586621679544266 ~> First b6989586621679544267) -> Type) a1) a2
type (arg1 :: First a) >> (arg2 :: First b) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type (arg1 :: First a) >> (arg2 :: First b) = Apply (Apply (TFHelper_6989586621679544790Sym0 :: TyFun (First a) (First b ~> First b) -> Type) arg1) arg2
type (a1 :: First a6989586621679544289) >>= (a2 :: a6989586621679544289 ~> First b6989586621679544290) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type (a1 :: First a6989586621679544289) >>= (a2 :: a6989586621679544289 ~> First b6989586621679544290) = Apply (Apply (TFHelper_6989586621680338419Sym0 :: TyFun (First a6989586621679544289) ((a6989586621679544289 ~> First b6989586621679544290) ~> First b6989586621679544290) -> Type) a1) a2
type MapM (arg1 :: a ~> m b) (arg2 :: First a) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type MapM (arg1 :: a ~> m b) (arg2 :: First a) = Apply (Apply (MapM_6989586621680747889Sym0 :: TyFun (a ~> m b) (First a ~> m (First b)) -> Type) arg1) arg2
type Traverse (a1 :: a6989586621680747832 ~> f6989586621680747831 b6989586621680747833) (a2 :: First a6989586621680747832) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type Traverse (a1 :: a6989586621680747832 ~> f6989586621680747831 b6989586621680747833) (a2 :: First a6989586621680747832) = Apply (Apply (Traverse_6989586621680754107Sym0 :: TyFun (a6989586621680747832 ~> f6989586621680747831 b6989586621680747833) (First a6989586621680747832 ~> f6989586621680747831 (First b6989586621680747833)) -> Type) a1) a2
type Foldl' (arg1 :: b ~> (a ~> b)) (arg2 :: b) (arg3 :: First a) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

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

Defined in Data.Singletons.Prelude.Foldable

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

Defined in Data.Singletons.Prelude.Foldable

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

Defined in Data.Singletons.Prelude.Foldable

type Foldr (a1 :: a6989586621680450322 ~> (k2 ~> k2)) (a2 :: k2) (a3 :: First a6989586621680450322) = Apply (Apply (Apply (Foldr_6989586621680532713Sym0 :: TyFun (a6989586621680450322 ~> (k2 ~> k2)) (k2 ~> (First a6989586621680450322 ~> k2)) -> Type) a1) a2) a3
type LiftA2 (arg1 :: a ~> (b ~> c)) (arg2 :: First a) (arg3 :: First b) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type LiftA2 (arg1 :: a ~> (b ~> c)) (arg2 :: First a) (arg3 :: First b) = Apply (Apply (Apply (LiftA2_6989586621679544727Sym0 :: TyFun (a ~> (b ~> c)) (First a ~> (First b ~> First c)) -> Type) arg1) arg2) arg3
type Apply (Compare_6989586621680333949Sym1 a6989586621680333947 :: TyFun (First a) Ordering -> Type) (a6989586621680333948 :: First a) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (Compare_6989586621680333949Sym1 a6989586621680333947 :: TyFun (First a) Ordering -> Type) (a6989586621680333948 :: First a) = Compare_6989586621680333949 a6989586621680333947 a6989586621680333948
type Apply (FoldMap_6989586621680532686Sym1 a6989586621680532684 :: TyFun (First a) m -> Type) (a6989586621680532685 :: First a) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (FoldMap_6989586621680532686Sym1 a6989586621680532684 :: TyFun (First a) m -> Type) (a6989586621680532685 :: First a) = FoldMap_6989586621680532686 a6989586621680532684 a6989586621680532685
type Apply (Foldr_6989586621680532713Sym2 a6989586621680532711 a6989586621680532710 :: TyFun (First a) b -> Type) (a6989586621680532712 :: First a) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Foldr_6989586621680532713Sym2 a6989586621680532711 a6989586621680532710 :: TyFun (First a) b -> Type) (a6989586621680532712 :: First a) = Foldr_6989586621680532713 a6989586621680532711 a6989586621680532710 a6989586621680532712
type Rep (First a)

Since: base-4.7.0.0

Instance details

Defined in Data.Monoid

type Rep (First a) = D1 (MetaData "First" "Data.Monoid" "base" True) (C1 (MetaCons "First" PrefixI True) (S1 (MetaSel (Just "getFirst") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe a))))
type Mempty 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Mempty = (Mempty_6989586621680338437Sym0 :: First a)
data Sing (b :: First a) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

data Sing (b :: First a) where
type Demote (First a) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Demote (First a) = First (Demote a)
type Rep1 First

Since: base-4.7.0.0

Instance details

Defined in Data.Monoid

type Rep1 First = D1 (MetaData "First" "Data.Monoid" "base" True) (C1 (MetaCons "First" PrefixI True) (S1 (MetaSel (Just "getFirst") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec1 Maybe)))
type Mconcat (arg :: [First a]) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Mconcat (arg :: [First a]) = Apply (Mconcat_6989586621680328808Sym0 :: TyFun [First a] (First a) -> Type) arg
type Show_ (arg :: First a) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Show_ (arg :: First a) = Apply (Show__6989586621680262307Sym0 :: TyFun (First a) Symbol -> Type) arg
type Sconcat (arg :: NonEmpty (First a)) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Sconcat (arg :: NonEmpty (First a)) = Apply (Sconcat_6989586621679810578Sym0 :: TyFun (NonEmpty (First a)) (First a) -> Type) arg
type Mappend (arg1 :: First a) (arg2 :: First a) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Mappend (arg1 :: First a) (arg2 :: First a) = Apply (Apply (Mappend_6989586621680328798Sym0 :: TyFun (First a) (First a ~> First a) -> Type) arg1) arg2
type ShowList (arg1 :: [First a]) arg2 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type ShowList (arg1 :: [First a]) arg2 = Apply (Apply (ShowList_6989586621680262318Sym0 :: TyFun [First a] (Symbol ~> Symbol) -> Type) arg1) arg2
type (a2 :: First a1) <> (a3 :: First a1) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type (a2 :: First a1) <> (a3 :: First a1) = Apply (Apply (TFHelper_6989586621680338433Sym0 :: TyFun (First a1) (First a1 ~> First a1) -> Type) a2) a3
type Min (arg1 :: First a) (arg2 :: First a) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Min (arg1 :: First a) (arg2 :: First a) = Apply (Apply (Min_6989586621679379811Sym0 :: TyFun (First a) (First a ~> First a) -> Type) arg1) arg2
type Max (arg1 :: First a) (arg2 :: First a) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Max (arg1 :: First a) (arg2 :: First a) = Apply (Apply (Max_6989586621679379793Sym0 :: TyFun (First a) (First a ~> First a) -> Type) arg1) arg2
type (arg1 :: First a) >= (arg2 :: First a) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type (arg1 :: First a) >= (arg2 :: First a) = Apply (Apply (TFHelper_6989586621679379775Sym0 :: TyFun (First a) (First a ~> Bool) -> Type) arg1) arg2
type (arg1 :: First a) > (arg2 :: First a) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type (arg1 :: First a) > (arg2 :: First a) = Apply (Apply (TFHelper_6989586621679379757Sym0 :: TyFun (First a) (First a ~> Bool) -> Type) arg1) arg2
type (arg1 :: First a) <= (arg2 :: First a) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type (arg1 :: First a) <= (arg2 :: First a) = Apply (Apply (TFHelper_6989586621679379739Sym0 :: TyFun (First a) (First a ~> Bool) -> Type) arg1) arg2
type (arg1 :: First a) < (arg2 :: First a) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type (arg1 :: First a) < (arg2 :: First a) = Apply (Apply (TFHelper_6989586621679379721Sym0 :: TyFun (First a) (First a ~> Bool) -> Type) arg1) arg2
type Compare (a2 :: First a1) (a3 :: First a1) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Compare (a2 :: First a1) (a3 :: First a1) = Apply (Apply (Compare_6989586621680333949Sym0 :: TyFun (First a1) (First a1 ~> Ordering) -> Type) a2) a3
type (x :: First a) /= (y :: First a) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type (x :: First a) /= (y :: First a) = Not (x == y)
type (a2 :: First a1) == (b :: First a1) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type (a2 :: First a1) == (b :: First a1) = Equals_6989586621680333501 a2 b
type ShowsPrec a2 (a3 :: First a1) a4 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type ShowsPrec a2 (a3 :: First a1) a4 = Apply (Apply (Apply (ShowsPrec_6989586621680335234Sym0 :: TyFun Nat (First a1 ~> (Symbol ~> Symbol)) -> Type) a2) a3) a4
type Apply (Pure_6989586621680338357Sym0 :: TyFun a (First a) -> Type) (a6989586621680338356 :: a) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (Pure_6989586621680338357Sym0 :: TyFun a (First a) -> Type) (a6989586621680338356 :: a) = Pure_6989586621680338357 a6989586621680338356
type Apply (Let6989586621680338429ASym0 :: TyFun a6989586621679072624 (First a6989586621679072624) -> Type) (wild_69895866216803382086989586621680338428 :: a6989586621679072624) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (Let6989586621680338429ASym0 :: TyFun a6989586621679072624 (First a6989586621679072624) -> Type) (wild_69895866216803382086989586621680338428 :: a6989586621679072624) = Let6989586621680338429A wild_69895866216803382086989586621680338428
type Apply (Lambda_6989586621680450691Sym2 y6989586621680450689 p6989586621680450688 :: TyFun a6989586621679072624 (First a6989586621679072624) -> Type) (t6989586621680450701 :: a6989586621679072624) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Lambda_6989586621680450691Sym2 y6989586621680450689 p6989586621680450688 :: TyFun a6989586621679072624 (First a6989586621679072624) -> Type) (t6989586621680450701 :: a6989586621679072624) = Lambda_6989586621680450691 y6989586621680450689 p6989586621680450688 t6989586621680450701
type Apply (GetFirstSym0 :: TyFun (First a) (Maybe a) -> Type) (a6989586621680332307 :: First a) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (GetFirstSym0 :: TyFun (First a) (Maybe a) -> Type) (a6989586621680332307 :: First a) = GetFirst a6989586621680332307
type Apply (FirstSym0 :: TyFun (Maybe a) (First a) -> Type) (t6989586621680332310 :: Maybe a) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (FirstSym0 :: TyFun (Maybe a) (First a) -> Type) (t6989586621680332310 :: Maybe a) = First t6989586621680332310
type Apply (TFHelper_6989586621680338433Sym1 a6989586621680338431 :: TyFun (First a) (First a) -> Type) (a6989586621680338432 :: First a) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (TFHelper_6989586621680338433Sym1 a6989586621680338431 :: TyFun (First a) (First a) -> Type) (a6989586621680338432 :: First a) = TFHelper_6989586621680338433 a6989586621680338431 a6989586621680338432
type Apply (Let6989586621680450690Scrutinee_6989586621680450577Sym1 p6989586621680450688 :: TyFun (t6989586621680450318 a6989586621680450321) (First a6989586621680450321) -> Type) (y6989586621680450689 :: t6989586621680450318 a6989586621680450321) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Let6989586621680450690Scrutinee_6989586621680450577Sym1 p6989586621680450688 :: TyFun (t6989586621680450318 a6989586621680450321) (First a6989586621680450321) -> Type) (y6989586621680450689 :: t6989586621680450318 a6989586621680450321) = Let6989586621680450690Scrutinee_6989586621680450577 p6989586621680450688 y6989586621680450689
type Apply (TFHelper_6989586621680338368Sym1 a6989586621680338366 :: TyFun (First a) (First b) -> Type) (a6989586621680338367 :: First a) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (TFHelper_6989586621680338368Sym1 a6989586621680338366 :: TyFun (First a) (First b) -> Type) (a6989586621680338367 :: First a) = TFHelper_6989586621680338368 a6989586621680338366 a6989586621680338367
type Apply (Fmap_6989586621680338380Sym1 a6989586621680338378 :: TyFun (First a) (First b) -> Type) (a6989586621680338379 :: First a) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (Fmap_6989586621680338380Sym1 a6989586621680338378 :: TyFun (First a) (First b) -> Type) (a6989586621680338379 :: First a) = Fmap_6989586621680338380 a6989586621680338378 a6989586621680338379
type Apply (TFHelper_6989586621680338392Sym1 a6989586621680338390 b :: TyFun (First b) (First a) -> Type) (a6989586621680338391 :: First b) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (TFHelper_6989586621680338392Sym1 a6989586621680338390 b :: TyFun (First b) (First a) -> Type) (a6989586621680338391 :: First b) = TFHelper_6989586621680338392 a6989586621680338390 a6989586621680338391
type Apply (Traverse_6989586621680754107Sym1 a6989586621680754105 :: TyFun (First a) (f (First b)) -> Type) (a6989586621680754106 :: First a) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type Apply (Traverse_6989586621680754107Sym1 a6989586621680754105 :: TyFun (First a) (f (First b)) -> Type) (a6989586621680754106 :: First a) = Traverse_6989586621680754107 a6989586621680754105 a6989586621680754106
type Apply (TFHelper_6989586621680338419Sym1 a6989586621680338417 b :: TyFun (a ~> First b) (First b) -> Type) (a6989586621680338418 :: a ~> First b) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (TFHelper_6989586621680338419Sym1 a6989586621680338417 b :: TyFun (a ~> First b) (First b) -> Type) (a6989586621680338418 :: a ~> First b) = TFHelper_6989586621680338419 a6989586621680338417 a6989586621680338418
type Apply (ShowsPrec_6989586621680335234Sym0 :: TyFun Nat (First a6989586621679072624 ~> (Symbol ~> Symbol)) -> Type) (a6989586621680335231 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (ShowsPrec_6989586621680335234Sym0 :: TyFun Nat (First a6989586621679072624 ~> (Symbol ~> Symbol)) -> Type) (a6989586621680335231 :: Nat) = (ShowsPrec_6989586621680335234Sym1 a6989586621680335231 a6989586621679072624 :: TyFun (First a6989586621679072624) (Symbol ~> Symbol) -> Type)
type Apply (TFHelper_6989586621680338392Sym0 :: TyFun a6989586621679544262 (First b6989586621679544263 ~> First a6989586621679544262) -> Type) (a6989586621680338390 :: a6989586621679544262) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (TFHelper_6989586621680338392Sym0 :: TyFun a6989586621679544262 (First b6989586621679544263 ~> First a6989586621679544262) -> Type) (a6989586621680338390 :: a6989586621679544262) = (TFHelper_6989586621680338392Sym1 a6989586621680338390 b6989586621679544263 :: TyFun (First b6989586621679544263) (First a6989586621679544262) -> Type)
type Apply (Lambda_6989586621680450691Sym1 p6989586621680450688 :: TyFun k (TyFun a6989586621679072624 (First a6989586621679072624) -> Type) -> Type) (y6989586621680450689 :: k) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Lambda_6989586621680450691Sym1 p6989586621680450688 :: TyFun k (TyFun a6989586621679072624 (First a6989586621679072624) -> Type) -> Type) (y6989586621680450689 :: k) = Lambda_6989586621680450691Sym2 p6989586621680450688 y6989586621680450689
type Apply (Lambda_6989586621680338402Sym0 :: TyFun k (TyFun (k1 ~> First a) (TyFun k1 (Maybe a) -> Type) -> Type) -> Type) (a6989586621680338400 :: k) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (Lambda_6989586621680338402Sym0 :: TyFun k (TyFun (k1 ~> First a) (TyFun k1 (Maybe a) -> Type) -> Type) -> Type) (a6989586621680338400 :: k) = (Lambda_6989586621680338402Sym1 a6989586621680338400 :: TyFun (k1 ~> First a) (TyFun k1 (Maybe a) -> Type) -> Type)
type Apply (Foldr_6989586621680532713Sym1 a6989586621680532710 :: TyFun b6989586621680450323 (First a6989586621680450322 ~> b6989586621680450323) -> Type) (a6989586621680532711 :: b6989586621680450323) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Foldr_6989586621680532713Sym1 a6989586621680532710 :: TyFun b6989586621680450323 (First a6989586621680450322 ~> b6989586621680450323) -> Type) (a6989586621680532711 :: b6989586621680450323) = Foldr_6989586621680532713Sym2 a6989586621680532710 a6989586621680532711
type Apply (Compare_6989586621680333949Sym0 :: TyFun (First a6989586621679072624) (First a6989586621679072624 ~> Ordering) -> Type) (a6989586621680333947 :: First a6989586621679072624) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (Compare_6989586621680333949Sym0 :: TyFun (First a6989586621679072624) (First a6989586621679072624 ~> Ordering) -> Type) (a6989586621680333947 :: First a6989586621679072624) = Compare_6989586621680333949Sym1 a6989586621680333947
type Apply (TFHelper_6989586621680338433Sym0 :: TyFun (First a6989586621680338189) (First a6989586621680338189 ~> First a6989586621680338189) -> Type) (a6989586621680338431 :: First a6989586621680338189) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (TFHelper_6989586621680338433Sym0 :: TyFun (First a6989586621680338189) (First a6989586621680338189 ~> First a6989586621680338189) -> Type) (a6989586621680338431 :: First a6989586621680338189) = TFHelper_6989586621680338433Sym1 a6989586621680338431
type Apply (ShowsPrec_6989586621680335234Sym1 a6989586621680335231 a6989586621679072624 :: TyFun (First a6989586621679072624) (Symbol ~> Symbol) -> Type) (a6989586621680335232 :: First a6989586621679072624) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (ShowsPrec_6989586621680335234Sym1 a6989586621680335231 a6989586621679072624 :: TyFun (First a6989586621679072624) (Symbol ~> Symbol) -> Type) (a6989586621680335232 :: First a6989586621679072624) = ShowsPrec_6989586621680335234Sym2 a6989586621680335231 a6989586621680335232
type Apply (TFHelper_6989586621680338368Sym0 :: TyFun (First (a6989586621679544266 ~> b6989586621679544267)) (First a6989586621679544266 ~> First b6989586621679544267) -> Type) (a6989586621680338366 :: First (a6989586621679544266 ~> b6989586621679544267)) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (TFHelper_6989586621680338368Sym0 :: TyFun (First (a6989586621679544266 ~> b6989586621679544267)) (First a6989586621679544266 ~> First b6989586621679544267) -> Type) (a6989586621680338366 :: First (a6989586621679544266 ~> b6989586621679544267)) = TFHelper_6989586621680338368Sym1 a6989586621680338366
type Apply (TFHelper_6989586621680338419Sym0 :: TyFun (First a6989586621679544289) ((a6989586621679544289 ~> First b6989586621679544290) ~> First b6989586621679544290) -> Type) (a6989586621680338417 :: First a6989586621679544289) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (TFHelper_6989586621680338419Sym0 :: TyFun (First a6989586621679544289) ((a6989586621679544289 ~> First b6989586621679544290) ~> First b6989586621679544290) -> Type) (a6989586621680338417 :: First a6989586621679544289) = (TFHelper_6989586621680338419Sym1 a6989586621680338417 b6989586621679544290 :: TyFun (a6989586621679544289 ~> First b6989586621679544290) (First b6989586621679544290) -> Type)
type Apply (Lambda_6989586621680450691Sym0 :: TyFun (a6989586621679072624 ~> Bool) (TyFun k (TyFun a6989586621679072624 (First a6989586621679072624) -> Type) -> Type) -> Type) (p6989586621680450688 :: a6989586621679072624 ~> Bool) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Lambda_6989586621680450691Sym0 :: TyFun (a6989586621679072624 ~> Bool) (TyFun k (TyFun a6989586621679072624 (First a6989586621679072624) -> Type) -> Type) -> Type) (p6989586621680450688 :: a6989586621679072624 ~> Bool) = (Lambda_6989586621680450691Sym1 p6989586621680450688 :: TyFun k (TyFun a6989586621679072624 (First a6989586621679072624) -> Type) -> Type)
type Apply (Let6989586621680450690Scrutinee_6989586621680450577Sym0 :: TyFun (a6989586621680450321 ~> Bool) (TyFun (t6989586621680450318 a6989586621680450321) (First a6989586621680450321) -> Type) -> Type) (p6989586621680450688 :: a6989586621680450321 ~> Bool) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Let6989586621680450690Scrutinee_6989586621680450577Sym0 :: TyFun (a6989586621680450321 ~> Bool) (TyFun (t6989586621680450318 a6989586621680450321) (First a6989586621680450321) -> Type) -> Type) (p6989586621680450688 :: a6989586621680450321 ~> Bool) = (Let6989586621680450690Scrutinee_6989586621680450577Sym1 p6989586621680450688 :: TyFun (t6989586621680450318 a6989586621680450321) (First a6989586621680450321) -> Type)
type Apply (Foldr_6989586621680532713Sym0 :: TyFun (a6989586621680450322 ~> (b6989586621680450323 ~> b6989586621680450323)) (b6989586621680450323 ~> (First a6989586621680450322 ~> b6989586621680450323)) -> Type) (a6989586621680532710 :: a6989586621680450322 ~> (b6989586621680450323 ~> b6989586621680450323)) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Foldr_6989586621680532713Sym0 :: TyFun (a6989586621680450322 ~> (b6989586621680450323 ~> b6989586621680450323)) (b6989586621680450323 ~> (First a6989586621680450322 ~> b6989586621680450323)) -> Type) (a6989586621680532710 :: a6989586621680450322 ~> (b6989586621680450323 ~> b6989586621680450323)) = Foldr_6989586621680532713Sym1 a6989586621680532710
type Apply (FoldMap_6989586621680532686Sym0 :: TyFun (a6989586621680450321 ~> m6989586621680450320) (First a6989586621680450321 ~> m6989586621680450320) -> Type) (a6989586621680532684 :: a6989586621680450321 ~> m6989586621680450320) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (FoldMap_6989586621680532686Sym0 :: TyFun (a6989586621680450321 ~> m6989586621680450320) (First a6989586621680450321 ~> m6989586621680450320) -> Type) (a6989586621680532684 :: a6989586621680450321 ~> m6989586621680450320) = FoldMap_6989586621680532686Sym1 a6989586621680532684
type Apply (Fmap_6989586621680338380Sym0 :: TyFun (a6989586621679544260 ~> b6989586621679544261) (First a6989586621679544260 ~> First b6989586621679544261) -> Type) (a6989586621680338378 :: a6989586621679544260 ~> b6989586621679544261) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (Fmap_6989586621680338380Sym0 :: TyFun (a6989586621679544260 ~> b6989586621679544261) (First a6989586621679544260 ~> First b6989586621679544261) -> Type) (a6989586621680338378 :: a6989586621679544260 ~> b6989586621679544261) = Fmap_6989586621680338380Sym1 a6989586621680338378
type Apply (Traverse_6989586621680754107Sym0 :: TyFun (a6989586621680747832 ~> f6989586621680747831 b6989586621680747833) (First a6989586621680747832 ~> f6989586621680747831 (First b6989586621680747833)) -> Type) (a6989586621680754105 :: a6989586621680747832 ~> f6989586621680747831 b6989586621680747833) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type Apply (Traverse_6989586621680754107Sym0 :: TyFun (a6989586621680747832 ~> f6989586621680747831 b6989586621680747833) (First a6989586621680747832 ~> f6989586621680747831 (First b6989586621680747833)) -> Type) (a6989586621680754105 :: a6989586621680747832 ~> f6989586621680747831 b6989586621680747833) = Traverse_6989586621680754107Sym1 a6989586621680754105
type Apply (Lambda_6989586621680338402Sym1 a6989586621680338400 :: TyFun (k1 ~> First a) (TyFun k1 (Maybe a) -> Type) -> Type) (k6989586621680338401 :: k1 ~> First a) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (Lambda_6989586621680338402Sym1 a6989586621680338400 :: TyFun (k1 ~> First a) (TyFun k1 (Maybe a) -> Type) -> Type) (k6989586621680338401 :: k1 ~> First a) = Lambda_6989586621680338402Sym2 a6989586621680338400 k6989586621680338401

newtype Last a #

Maybe monoid returning the rightmost non-Nothing value.

Last a is isomorphic to Dual (First a), and thus to Dual (Alt Maybe a)

>>> getLast (Last (Just "hello") <> Last Nothing <> Last (Just "world"))
Just "world"

Use of this type is discouraged. Note the following equivalence:

Data.Monoid.Last x === Maybe (Data.Semigroup.Last x)

In addition to being equivalent in the structural sense, the two also have Monoid instances that behave the same. This type will be marked deprecated in GHC 8.8, and removed in GHC 8.10. Users are advised to use the variant from Data.Semigroup and wrap it in Maybe.

Constructors

Last 

Fields

Instances
Monad Last

Since: base-4.8.0.0

Instance details

Defined in Data.Monoid

Methods

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

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

return :: a -> Last a #

fail :: String -> Last a #

Functor Last

Since: base-4.8.0.0

Instance details

Defined in Data.Monoid

Methods

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

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

Applicative Last

Since: base-4.8.0.0

Instance details

Defined in Data.Monoid

Methods

pure :: a -> Last a #

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

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

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

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

Foldable Last

Since: base-4.8.0.0

Instance details

Defined in Data.Foldable

Methods

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

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

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

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

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

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

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

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

toList :: Last a -> [a] #

null :: Last a -> Bool #

length :: Last a -> Int #

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

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

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

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

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

Traversable Last

Since: base-4.8.0.0

Instance details

Defined in Data.Traversable

Methods

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

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

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

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

PTraversable Last 
Instance details

Defined in Data.Singletons.Prelude.Traversable

Associated Types

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

type SequenceA arg :: f (t a) #

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

type Sequence arg :: m (t a) #

STraversable Last 
Instance details

Defined in Data.Singletons.Prelude.Traversable

Methods

sTraverse :: SApplicative f => Sing t1 -> Sing t2 -> Sing (Apply (Apply TraverseSym0 t1) t2) #

sSequenceA :: SApplicative f => Sing t1 -> Sing (Apply SequenceASym0 t1) #

sMapM :: SMonad m => Sing t1 -> Sing t2 -> Sing (Apply (Apply MapMSym0 t1) t2) #

sSequence :: SMonad m => Sing t1 -> Sing (Apply SequenceSym0 t1) #

PFoldable Last 
Instance details

Defined in Data.Singletons.Prelude.Foldable

Associated Types

type Fold arg :: m #

type FoldMap arg arg1 :: m #

type Foldr arg arg1 arg2 :: b #

type Foldr' arg arg1 arg2 :: b #

type Foldl arg arg1 arg2 :: b #

type Foldl' arg arg1 arg2 :: b #

type Foldr1 arg arg1 :: a #

type Foldl1 arg arg1 :: a #

type ToList arg :: [a] #

type Null arg :: Bool #

type Length arg :: Nat #

type Elem arg arg1 :: Bool #

type Maximum arg :: a #

type Minimum arg :: a #

type Sum arg :: a #

type Product arg :: a #

SFoldable Last 
Instance details

Defined in Data.Singletons.Prelude.Foldable

Methods

sFold :: SMonoid m => Sing t1 -> Sing (Apply FoldSym0 t1) #

sFoldMap :: SMonoid m => Sing t1 -> Sing t2 -> Sing (Apply (Apply FoldMapSym0 t1) t2) #

sFoldr :: Sing t1 -> Sing t2 -> Sing t3 -> Sing (Apply (Apply (Apply FoldrSym0 t1) t2) t3) #

sFoldr' :: Sing t1 -> Sing t2 -> Sing t3 -> Sing (Apply (Apply (Apply Foldr'Sym0 t1) t2) t3) #

sFoldl :: Sing t1 -> Sing t2 -> Sing t3 -> Sing (Apply (Apply (Apply FoldlSym0 t1) t2) t3) #

sFoldl' :: Sing t1 -> Sing t2 -> Sing t3 -> Sing (Apply (Apply (Apply Foldl'Sym0 t1) t2) t3) #

sFoldr1 :: Sing t1 -> Sing t2 -> Sing (Apply (Apply Foldr1Sym0 t1) t2) #

sFoldl1 :: Sing t1 -> Sing t2 -> Sing (Apply (Apply Foldl1Sym0 t1) t2) #

sToList :: Sing t1 -> Sing (Apply ToListSym0 t1) #

sNull :: Sing t1 -> Sing (Apply NullSym0 t1) #

sLength :: Sing t1 -> Sing (Apply LengthSym0 t1) #

sElem :: SEq a => Sing t1 -> Sing t2 -> Sing (Apply (Apply ElemSym0 t1) t2) #

sMaximum :: SOrd a => Sing t1 -> Sing (Apply MaximumSym0 t1) #

sMinimum :: SOrd a => Sing t1 -> Sing (Apply MinimumSym0 t1) #

sSum :: SNum a => Sing t1 -> Sing (Apply SumSym0 t1) #

sProduct :: SNum a => Sing t1 -> Sing (Apply ProductSym0 t1) #

Eq a => Eq (Last a)

Since: base-2.1

Instance details

Defined in Data.Monoid

Methods

(==) :: Last a -> Last a -> Bool #

(/=) :: Last a -> Last a -> Bool #

Ord a => Ord (Last a)

Since: base-2.1

Instance details

Defined in Data.Monoid

Methods

compare :: Last a -> Last a -> Ordering #

(<) :: Last a -> Last a -> Bool #

(<=) :: Last a -> Last a -> Bool #

(>) :: Last a -> Last a -> Bool #

(>=) :: Last a -> Last a -> Bool #

max :: Last a -> Last a -> Last a #

min :: Last a -> Last a -> Last a #

Read a => Read (Last a)

Since: base-2.1

Instance details

Defined in Data.Monoid

Show a => Show (Last a)

Since: base-2.1

Instance details

Defined in Data.Monoid

Methods

showsPrec :: Int -> Last a -> ShowS #

show :: Last a -> String #

showList :: [Last a] -> ShowS #

Generic (Last a) 
Instance details

Defined in Data.Monoid

Associated Types

type Rep (Last a) :: Type -> Type #

Methods

from :: Last a -> Rep (Last a) x #

to :: Rep (Last a) x -> Last a #

Semigroup (Last a)

Since: base-4.9.0.0

Instance details

Defined in Data.Monoid

Methods

(<>) :: Last a -> Last a -> Last a #

sconcat :: NonEmpty (Last a) -> Last a #

stimes :: Integral b => b -> Last a -> Last a #

Monoid (Last a)

Since: base-2.1

Instance details

Defined in Data.Monoid

Methods

mempty :: Last a #

mappend :: Last a -> Last a -> Last a #

mconcat :: [Last a] -> Last a #

Default (Last a) 
Instance details

Defined in Data.Default.Class

Methods

def :: Last a #

PMonoid (Last a) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

Associated Types

type Mempty :: a #

type Mappend arg arg1 :: a #

type Mconcat arg :: a #

SMonoid (Last a) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

Generic1 Last 
Instance details

Defined in Data.Monoid

Associated Types

type Rep1 Last :: k -> Type #

Methods

from1 :: Last a -> Rep1 Last a #

to1 :: Rep1 Last a -> Last a #

SuppressUnusedWarnings (LastSym0 :: TyFun (Maybe a6989586621679072619) (Last a6989586621679072619) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

SuppressUnusedWarnings (ShowsPrec_6989586621680335263Sym0 :: TyFun Nat (Last a6989586621679072619 ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

SuppressUnusedWarnings (Pure_6989586621680338445Sym0 :: TyFun a6989586621679544265 (Last a6989586621679544265) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

SuppressUnusedWarnings (Let6989586621680338517BSym0 :: TyFun a6989586621679072619 (Last a6989586621679072619) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

SuppressUnusedWarnings (TFHelper_6989586621680338521Sym0 :: TyFun (Last a6989586621680338199) (Last a6989586621680338199 ~> Last a6989586621680338199) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

SuppressUnusedWarnings (GetLastSym0 :: TyFun (Last a6989586621679072619) (Maybe a6989586621679072619) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

SuppressUnusedWarnings (Compare_6989586621680333970Sym0 :: TyFun (Last a6989586621679072619) (Last a6989586621679072619 ~> Ordering) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

SingI (LastSym0 :: TyFun (Maybe a) (Last a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

Methods

sing :: Sing LastSym0 #

SuppressUnusedWarnings (TFHelper_6989586621680338480Sym0 :: TyFun a6989586621679544262 (Last b6989586621679544263 ~> Last a6989586621679544262) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

SuppressUnusedWarnings (TFHelper_6989586621680338521Sym1 a6989586621680338519 :: TyFun (Last a6989586621680338199) (Last a6989586621680338199) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

SuppressUnusedWarnings (TFHelper_6989586621680338507Sym0 :: TyFun (Last a6989586621679544289) ((a6989586621679544289 ~> Last b6989586621679544290) ~> Last b6989586621679544290) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

SuppressUnusedWarnings (ShowsPrec_6989586621680335263Sym1 a6989586621680335260 a6989586621679072619 :: TyFun (Last a6989586621679072619) (Symbol ~> Symbol) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

SuppressUnusedWarnings (Compare_6989586621680333970Sym1 a6989586621680333968 :: TyFun (Last a6989586621679072619) Ordering -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

SuppressUnusedWarnings (TFHelper_6989586621680338456Sym0 :: TyFun (Last (a6989586621679544266 ~> b6989586621679544267)) (Last a6989586621679544266 ~> Last b6989586621679544267) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

SuppressUnusedWarnings (Foldr_6989586621680532753Sym0 :: TyFun (a6989586621680450322 ~> (b6989586621680450323 ~> b6989586621680450323)) (b6989586621680450323 ~> (Last a6989586621680450322 ~> b6989586621680450323)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (FoldMap_6989586621680532726Sym0 :: TyFun (a6989586621680450321 ~> m6989586621680450320) (Last a6989586621680450321 ~> m6989586621680450320) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (Fmap_6989586621680338468Sym0 :: TyFun (a6989586621679544260 ~> b6989586621679544261) (Last a6989586621679544260 ~> Last b6989586621679544261) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

SuppressUnusedWarnings (Foldr_6989586621680532753Sym1 a6989586621680532750 :: TyFun b6989586621680450323 (Last a6989586621680450322 ~> b6989586621680450323) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (Lambda_6989586621680338490Sym0 :: TyFun k (TyFun (k1 ~> Last a) (TyFun k1 (Maybe a) -> Type) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

SuppressUnusedWarnings (FoldMap_6989586621680532726Sym1 a6989586621680532724 :: TyFun (Last a6989586621680450321) m6989586621680450320 -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (TFHelper_6989586621680338480Sym1 a6989586621680338478 b6989586621679544263 :: TyFun (Last b6989586621679544263) (Last a6989586621679544262) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

SuppressUnusedWarnings (TFHelper_6989586621680338456Sym1 a6989586621680338454 :: TyFun (Last a6989586621679544266) (Last b6989586621679544267) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

SuppressUnusedWarnings (Fmap_6989586621680338468Sym1 a6989586621680338466 :: TyFun (Last a6989586621679544260) (Last b6989586621679544261) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

SuppressUnusedWarnings (Traverse_6989586621680754119Sym0 :: TyFun (a6989586621680747832 ~> f6989586621680747831 b6989586621680747833) (Last a6989586621680747832 ~> f6989586621680747831 (Last b6989586621680747833)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

SuppressUnusedWarnings (TFHelper_6989586621680338507Sym1 a6989586621680338505 b6989586621679544290 :: TyFun (a6989586621679544289 ~> Last b6989586621679544290) (Last b6989586621679544290) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

SuppressUnusedWarnings (Traverse_6989586621680754119Sym1 a6989586621680754117 :: TyFun (Last a6989586621680747832) (f6989586621680747831 (Last b6989586621680747833)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

SuppressUnusedWarnings (Foldr_6989586621680532753Sym2 a6989586621680532751 a6989586621680532750 :: TyFun (Last a6989586621680450322) b6989586621680450323 -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (Lambda_6989586621680338490Sym1 a6989586621680338488 :: TyFun (k1 ~> Last a) (TyFun k1 (Maybe a) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Product (arg :: Last a) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Product (arg :: Last a) = Apply (Product_6989586621680451297Sym0 :: TyFun (Last a) a -> Type) arg
type Sum (arg :: Last a) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Sum (arg :: Last a) = Apply (Sum_6989586621680451284Sym0 :: TyFun (Last a) a -> Type) arg
type Minimum (arg :: Last a) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

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

Defined in Data.Singletons.Prelude.Foldable

type Maximum (arg :: Last a) = Apply (Maximum_6989586621680451258Sym0 :: TyFun (Last a) a -> Type) arg
type Length (arg :: Last a) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Length (arg :: Last a) = Apply (Length_6989586621680451229Sym0 :: TyFun (Last a) Nat -> Type) arg
type Null (arg :: Last a) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Null (arg :: Last a) = Apply (Null_6989586621680451207Sym0 :: TyFun (Last a) Bool -> Type) arg
type ToList (arg :: Last a) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type ToList (arg :: Last a) = Apply (ToList_6989586621680451186Sym0 :: TyFun (Last a) [a] -> Type) arg
type Fold (arg :: Last m) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Fold (arg :: Last m) = Apply (Fold_6989586621680451003Sym0 :: TyFun (Last m) m -> Type) arg
type Pure (a :: k1) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Pure (a :: k1) = Apply (Pure_6989586621680338445Sym0 :: TyFun k1 (Last k1) -> Type) a
type Fail arg 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Fail arg = Apply (Fail_6989586621679544807Sym0 :: TyFun Symbol (Last a) -> Type) arg
type Return (arg :: a) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Return (arg :: a) = Apply (Return_6989586621679544800Sym0 :: TyFun a (Last a) -> Type) arg
type Sequence (arg :: Last (m a)) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type Sequence (arg :: Last (m a)) = Apply (Sequence_6989586621680747899Sym0 :: TyFun (Last (m a)) (m (Last a)) -> Type) arg
type SequenceA (arg :: Last (f a)) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type SequenceA (arg :: Last (f a)) = Apply (SequenceA_6989586621680747874Sym0 :: TyFun (Last (f a)) (f (Last a)) -> Type) arg
type Elem (arg1 :: a) (arg2 :: Last a) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Elem (arg1 :: a) (arg2 :: Last a) = Apply (Apply (Elem_6989586621680451244Sym0 :: TyFun a (Last a ~> Bool) -> Type) arg1) arg2
type Foldl1 (arg1 :: a ~> (a ~> a)) (arg2 :: Last a) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Foldl1 (arg1 :: a ~> (a ~> a)) (arg2 :: Last a) = Apply (Apply (Foldl1_6989586621680451176Sym0 :: TyFun (a ~> (a ~> a)) (Last a ~> a) -> Type) arg1) arg2
type Foldr1 (arg1 :: a ~> (a ~> a)) (arg2 :: Last a) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Foldr1 (arg1 :: a ~> (a ~> a)) (arg2 :: Last a) = Apply (Apply (Foldr1_6989586621680451151Sym0 :: TyFun (a ~> (a ~> a)) (Last a ~> a) -> Type) arg1) arg2
type FoldMap (a1 :: a6989586621680450321 ~> k2) (a2 :: Last a6989586621680450321) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type FoldMap (a1 :: a6989586621680450321 ~> k2) (a2 :: Last a6989586621680450321) = Apply (Apply (FoldMap_6989586621680532726Sym0 :: TyFun (a6989586621680450321 ~> k2) (Last a6989586621680450321 ~> k2) -> Type) a1) a2
type (a1 :: k1) <$ (a2 :: Last b6989586621679544263) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type (a1 :: k1) <$ (a2 :: Last b6989586621679544263) = Apply (Apply (TFHelper_6989586621680338480Sym0 :: TyFun k1 (Last b6989586621679544263 ~> Last k1) -> Type) a1) a2
type Fmap (a1 :: a6989586621679544260 ~> b6989586621679544261) (a2 :: Last a6989586621679544260) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Fmap (a1 :: a6989586621679544260 ~> b6989586621679544261) (a2 :: Last a6989586621679544260) = Apply (Apply (Fmap_6989586621680338468Sym0 :: TyFun (a6989586621679544260 ~> b6989586621679544261) (Last a6989586621679544260 ~> Last b6989586621679544261) -> Type) a1) a2
type (arg1 :: Last a) <* (arg2 :: Last b) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

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

Defined in Data.Singletons.Prelude.Monoid

type (arg1 :: Last a) *> (arg2 :: Last b) = Apply (Apply (TFHelper_6989586621679544740Sym0 :: TyFun (Last a) (Last b ~> Last b) -> Type) arg1) arg2
type (a1 :: Last (a6989586621679544266 ~> b6989586621679544267)) <*> (a2 :: Last a6989586621679544266) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type (a1 :: Last (a6989586621679544266 ~> b6989586621679544267)) <*> (a2 :: Last a6989586621679544266) = Apply (Apply (TFHelper_6989586621680338456Sym0 :: TyFun (Last (a6989586621679544266 ~> b6989586621679544267)) (Last a6989586621679544266 ~> Last b6989586621679544267) -> Type) a1) a2
type (arg1 :: Last a) >> (arg2 :: Last b) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type (arg1 :: Last a) >> (arg2 :: Last b) = Apply (Apply (TFHelper_6989586621679544790Sym0 :: TyFun (Last a) (Last b ~> Last b) -> Type) arg1) arg2
type (a1 :: Last a6989586621679544289) >>= (a2 :: a6989586621679544289 ~> Last b6989586621679544290) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type (a1 :: Last a6989586621679544289) >>= (a2 :: a6989586621679544289 ~> Last b6989586621679544290) = Apply (Apply (TFHelper_6989586621680338507Sym0 :: TyFun (Last a6989586621679544289) ((a6989586621679544289 ~> Last b6989586621679544290) ~> Last b6989586621679544290) -> Type) a1) a2
type MapM (arg1 :: a ~> m b) (arg2 :: Last a) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type MapM (arg1 :: a ~> m b) (arg2 :: Last a) = Apply (Apply (MapM_6989586621680747889Sym0 :: TyFun (a ~> m b) (Last a ~> m (Last b)) -> Type) arg1) arg2
type Traverse (a1 :: a6989586621680747832 ~> f6989586621680747831 b6989586621680747833) (a2 :: Last a6989586621680747832) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type Traverse (a1 :: a6989586621680747832 ~> f6989586621680747831 b6989586621680747833) (a2 :: Last a6989586621680747832) = Apply (Apply (Traverse_6989586621680754119Sym0 :: TyFun (a6989586621680747832 ~> f6989586621680747831 b6989586621680747833) (Last a6989586621680747832 ~> f6989586621680747831 (Last b6989586621680747833)) -> Type) a1) a2
type Foldl' (arg1 :: b ~> (a ~> b)) (arg2 :: b) (arg3 :: Last a) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

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

Defined in Data.Singletons.Prelude.Foldable

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

Defined in Data.Singletons.Prelude.Foldable

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

Defined in Data.Singletons.Prelude.Foldable

type Foldr (a1 :: a6989586621680450322 ~> (k2 ~> k2)) (a2 :: k2) (a3 :: Last a6989586621680450322) = Apply (Apply (Apply (Foldr_6989586621680532753Sym0 :: TyFun (a6989586621680450322 ~> (k2 ~> k2)) (k2 ~> (Last a6989586621680450322 ~> k2)) -> Type) a1) a2) a3
type LiftA2 (arg1 :: a ~> (b ~> c)) (arg2 :: Last a) (arg3 :: Last b) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type LiftA2 (arg1 :: a ~> (b ~> c)) (arg2 :: Last a) (arg3 :: Last b) = Apply (Apply (Apply (LiftA2_6989586621679544727Sym0 :: TyFun (a ~> (b ~> c)) (Last a ~> (Last b ~> Last c)) -> Type) arg1) arg2) arg3
type Apply (Compare_6989586621680333970Sym1 a6989586621680333968 :: TyFun (Last a) Ordering -> Type) (a6989586621680333969 :: Last a) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (Compare_6989586621680333970Sym1 a6989586621680333968 :: TyFun (Last a) Ordering -> Type) (a6989586621680333969 :: Last a) = Compare_6989586621680333970 a6989586621680333968 a6989586621680333969
type Apply (FoldMap_6989586621680532726Sym1 a6989586621680532724 :: TyFun (Last a) m -> Type) (a6989586621680532725 :: Last a) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (FoldMap_6989586621680532726Sym1 a6989586621680532724 :: TyFun (Last a) m -> Type) (a6989586621680532725 :: Last a) = FoldMap_6989586621680532726 a6989586621680532724 a6989586621680532725
type Apply (Foldr_6989586621680532753Sym2 a6989586621680532751 a6989586621680532750 :: TyFun (Last a) b -> Type) (a6989586621680532752 :: Last a) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Foldr_6989586621680532753Sym2 a6989586621680532751 a6989586621680532750 :: TyFun (Last a) b -> Type) (a6989586621680532752 :: Last a) = Foldr_6989586621680532753 a6989586621680532751 a6989586621680532750 a6989586621680532752
type Rep (Last a)

Since: base-4.7.0.0

Instance details

Defined in Data.Monoid

type Rep (Last a) = D1 (MetaData "Last" "Data.Monoid" "base" True) (C1 (MetaCons "Last" PrefixI True) (S1 (MetaSel (Just "getLast") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe a))))
type Mempty 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Mempty = (Mempty_6989586621680338525Sym0 :: Last a)
data Sing (b :: Last a) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

data Sing (b :: Last a) where
type Demote (Last a) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Demote (Last a) = Last (Demote a)
type Rep1 Last

Since: base-4.7.0.0

Instance details

Defined in Data.Monoid

type Rep1 Last = D1 (MetaData "Last" "Data.Monoid" "base" True) (C1 (MetaCons "Last" PrefixI True) (S1 (MetaSel (Just "getLast") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec1 Maybe)))
type Mconcat (arg :: [Last a]) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Mconcat (arg :: [Last a]) = Apply (Mconcat_6989586621680328808Sym0 :: TyFun [Last a] (Last a) -> Type) arg
type Show_ (arg :: Last a) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Show_ (arg :: Last a) = Apply (Show__6989586621680262307Sym0 :: TyFun (Last a) Symbol -> Type) arg
type Sconcat (arg :: NonEmpty (Last a)) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Sconcat (arg :: NonEmpty (Last a)) = Apply (Sconcat_6989586621679810578Sym0 :: TyFun (NonEmpty (Last a)) (Last a) -> Type) arg
type Mappend (arg1 :: Last a) (arg2 :: Last a) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Mappend (arg1 :: Last a) (arg2 :: Last a) = Apply (Apply (Mappend_6989586621680328798Sym0 :: TyFun (Last a) (Last a ~> Last a) -> Type) arg1) arg2
type ShowList (arg1 :: [Last a]) arg2 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type ShowList (arg1 :: [Last a]) arg2 = Apply (Apply (ShowList_6989586621680262318Sym0 :: TyFun [Last a] (Symbol ~> Symbol) -> Type) arg1) arg2
type (a2 :: Last a1) <> (a3 :: Last a1) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type (a2 :: Last a1) <> (a3 :: Last a1) = Apply (Apply (TFHelper_6989586621680338521Sym0 :: TyFun (Last a1) (Last a1 ~> Last a1) -> Type) a2) a3
type Min (arg1 :: Last a) (arg2 :: Last a) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Min (arg1 :: Last a) (arg2 :: Last a) = Apply (Apply (Min_6989586621679379811Sym0 :: TyFun (Last a) (Last a ~> Last a) -> Type) arg1) arg2
type Max (arg1 :: Last a) (arg2 :: Last a) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Max (arg1 :: Last a) (arg2 :: Last a) = Apply (Apply (Max_6989586621679379793Sym0 :: TyFun (Last a) (Last a ~> Last a) -> Type) arg1) arg2
type (arg1 :: Last a) >= (arg2 :: Last a) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type (arg1 :: Last a) >= (arg2 :: Last a) = Apply (Apply (TFHelper_6989586621679379775Sym0 :: TyFun (Last a) (Last a ~> Bool) -> Type) arg1) arg2
type (arg1 :: Last a) > (arg2 :: Last a) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type (arg1 :: Last a) > (arg2 :: Last a) = Apply (Apply (TFHelper_6989586621679379757Sym0 :: TyFun (Last a) (Last a ~> Bool) -> Type) arg1) arg2
type (arg1 :: Last a) <= (arg2 :: Last a) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type (arg1 :: Last a) <= (arg2 :: Last a) = Apply (Apply (TFHelper_6989586621679379739Sym0 :: TyFun (Last a) (Last a ~> Bool) -> Type) arg1) arg2
type (arg1 :: Last a) < (arg2 :: Last a) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type (arg1 :: Last a) < (arg2 :: Last a) = Apply (Apply (TFHelper_6989586621679379721Sym0 :: TyFun (Last a) (Last a ~> Bool) -> Type) arg1) arg2
type Compare (a2 :: Last a1) (a3 :: Last a1) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Compare (a2 :: Last a1) (a3 :: Last a1) = Apply (Apply (Compare_6989586621680333970Sym0 :: TyFun (Last a1) (Last a1 ~> Ordering) -> Type) a2) a3
type (x :: Last a) /= (y :: Last a) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type (x :: Last a) /= (y :: Last a) = Not (x == y)
type (a2 :: Last a1) == (b :: Last a1) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type (a2 :: Last a1) == (b :: Last a1) = Equals_6989586621680333515 a2 b
type ShowsPrec a2 (a3 :: Last a1) a4 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type ShowsPrec a2 (a3 :: Last a1) a4 = Apply (Apply (Apply (ShowsPrec_6989586621680335263Sym0 :: TyFun Nat (Last a1 ~> (Symbol ~> Symbol)) -> Type) a2) a3) a4
type Apply (Pure_6989586621680338445Sym0 :: TyFun a (Last a) -> Type) (a6989586621680338444 :: a) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (Pure_6989586621680338445Sym0 :: TyFun a (Last a) -> Type) (a6989586621680338444 :: a) = Pure_6989586621680338445 a6989586621680338444
type Apply (Let6989586621680338517BSym0 :: TyFun a6989586621679072619 (Last a6989586621679072619) -> Type) (wild_69895866216803382156989586621680338516 :: a6989586621679072619) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (Let6989586621680338517BSym0 :: TyFun a6989586621679072619 (Last a6989586621679072619) -> Type) (wild_69895866216803382156989586621680338516 :: a6989586621679072619) = Let6989586621680338517B wild_69895866216803382156989586621680338516
type Apply (GetLastSym0 :: TyFun (Last a) (Maybe a) -> Type) (a6989586621680332328 :: Last a) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (GetLastSym0 :: TyFun (Last a) (Maybe a) -> Type) (a6989586621680332328 :: Last a) = GetLast a6989586621680332328
type Apply (LastSym0 :: TyFun (Maybe a) (Last a) -> Type) (t6989586621680332331 :: Maybe a) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (LastSym0 :: TyFun (Maybe a) (Last a) -> Type) (t6989586621680332331 :: Maybe a) = Last t6989586621680332331
type Apply (TFHelper_6989586621680338521Sym1 a6989586621680338519 :: TyFun (Last a) (Last a) -> Type) (a6989586621680338520 :: Last a) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (TFHelper_6989586621680338521Sym1 a6989586621680338519 :: TyFun (Last a) (Last a) -> Type) (a6989586621680338520 :: Last a) = TFHelper_6989586621680338521 a6989586621680338519 a6989586621680338520
type Apply (TFHelper_6989586621680338456Sym1 a6989586621680338454 :: TyFun (Last a) (Last b) -> Type) (a6989586621680338455 :: Last a) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (TFHelper_6989586621680338456Sym1 a6989586621680338454 :: TyFun (Last a) (Last b) -> Type) (a6989586621680338455 :: Last a) = TFHelper_6989586621680338456 a6989586621680338454 a6989586621680338455
type Apply (Fmap_6989586621680338468Sym1 a6989586621680338466 :: TyFun (Last a) (Last b) -> Type) (a6989586621680338467 :: Last a) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (Fmap_6989586621680338468Sym1 a6989586621680338466 :: TyFun (Last a) (Last b) -> Type) (a6989586621680338467 :: Last a) = Fmap_6989586621680338468 a6989586621680338466 a6989586621680338467
type Apply (TFHelper_6989586621680338480Sym1 a6989586621680338478 b :: TyFun (Last b) (Last a) -> Type) (a6989586621680338479 :: Last b) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (TFHelper_6989586621680338480Sym1 a6989586621680338478 b :: TyFun (Last b) (Last a) -> Type) (a6989586621680338479 :: Last b) = TFHelper_6989586621680338480 a6989586621680338478 a6989586621680338479
type Apply (Traverse_6989586621680754119Sym1 a6989586621680754117 :: TyFun (Last a) (f (Last b)) -> Type) (a6989586621680754118 :: Last a) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type Apply (Traverse_6989586621680754119Sym1 a6989586621680754117 :: TyFun (Last a) (f (Last b)) -> Type) (a6989586621680754118 :: Last a) = Traverse_6989586621680754119 a6989586621680754117 a6989586621680754118
type Apply (TFHelper_6989586621680338507Sym1 a6989586621680338505 b :: TyFun (a ~> Last b) (Last b) -> Type) (a6989586621680338506 :: a ~> Last b) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (TFHelper_6989586621680338507Sym1 a6989586621680338505 b :: TyFun (a ~> Last b) (Last b) -> Type) (a6989586621680338506 :: a ~> Last b) = TFHelper_6989586621680338507 a6989586621680338505 a6989586621680338506
type Apply (ShowsPrec_6989586621680335263Sym0 :: TyFun Nat (Last a6989586621679072619 ~> (Symbol ~> Symbol)) -> Type) (a6989586621680335260 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (ShowsPrec_6989586621680335263Sym0 :: TyFun Nat (Last a6989586621679072619 ~> (Symbol ~> Symbol)) -> Type) (a6989586621680335260 :: Nat) = (ShowsPrec_6989586621680335263Sym1 a6989586621680335260 a6989586621679072619 :: TyFun (Last a6989586621679072619) (Symbol ~> Symbol) -> Type)
type Apply (TFHelper_6989586621680338480Sym0 :: TyFun a6989586621679544262 (Last b6989586621679544263 ~> Last a6989586621679544262) -> Type) (a6989586621680338478 :: a6989586621679544262) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (TFHelper_6989586621680338480Sym0 :: TyFun a6989586621679544262 (Last b6989586621679544263 ~> Last a6989586621679544262) -> Type) (a6989586621680338478 :: a6989586621679544262) = (TFHelper_6989586621680338480Sym1 a6989586621680338478 b6989586621679544263 :: TyFun (Last b6989586621679544263) (Last a6989586621679544262) -> Type)
type Apply (Lambda_6989586621680338490Sym0 :: TyFun k (TyFun (k1 ~> Last a) (TyFun k1 (Maybe a) -> Type) -> Type) -> Type) (a6989586621680338488 :: k) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (Lambda_6989586621680338490Sym0 :: TyFun k (TyFun (k1 ~> Last a) (TyFun k1 (Maybe a) -> Type) -> Type) -> Type) (a6989586621680338488 :: k) = (Lambda_6989586621680338490Sym1 a6989586621680338488 :: TyFun (k1 ~> Last a) (TyFun k1 (Maybe a) -> Type) -> Type)
type Apply (Foldr_6989586621680532753Sym1 a6989586621680532750 :: TyFun b6989586621680450323 (Last a6989586621680450322 ~> b6989586621680450323) -> Type) (a6989586621680532751 :: b6989586621680450323) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Foldr_6989586621680532753Sym1 a6989586621680532750 :: TyFun b6989586621680450323 (Last a6989586621680450322 ~> b6989586621680450323) -> Type) (a6989586621680532751 :: b6989586621680450323) = Foldr_6989586621680532753Sym2 a6989586621680532750 a6989586621680532751
type Apply (Compare_6989586621680333970Sym0 :: TyFun (Last a6989586621679072619) (Last a6989586621679072619 ~> Ordering) -> Type) (a6989586621680333968 :: Last a6989586621679072619) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (Compare_6989586621680333970Sym0 :: TyFun (Last a6989586621679072619) (Last a6989586621679072619 ~> Ordering) -> Type) (a6989586621680333968 :: Last a6989586621679072619) = Compare_6989586621680333970Sym1 a6989586621680333968
type Apply (TFHelper_6989586621680338521Sym0 :: TyFun (Last a6989586621680338199) (Last a6989586621680338199 ~> Last a6989586621680338199) -> Type) (a6989586621680338519 :: Last a6989586621680338199) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (TFHelper_6989586621680338521Sym0 :: TyFun (Last a6989586621680338199) (Last a6989586621680338199 ~> Last a6989586621680338199) -> Type) (a6989586621680338519 :: Last a6989586621680338199) = TFHelper_6989586621680338521Sym1 a6989586621680338519
type Apply (ShowsPrec_6989586621680335263Sym1 a6989586621680335260 a6989586621679072619 :: TyFun (Last a6989586621679072619) (Symbol ~> Symbol) -> Type) (a6989586621680335261 :: Last a6989586621679072619) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (ShowsPrec_6989586621680335263Sym1 a6989586621680335260 a6989586621679072619 :: TyFun (Last a6989586621679072619) (Symbol ~> Symbol) -> Type) (a6989586621680335261 :: Last a6989586621679072619) = ShowsPrec_6989586621680335263Sym2 a6989586621680335260 a6989586621680335261
type Apply (TFHelper_6989586621680338456Sym0 :: TyFun (Last (a6989586621679544266 ~> b6989586621679544267)) (Last a6989586621679544266 ~> Last b6989586621679544267) -> Type) (a6989586621680338454 :: Last (a6989586621679544266 ~> b6989586621679544267)) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (TFHelper_6989586621680338456Sym0 :: TyFun (Last (a6989586621679544266 ~> b6989586621679544267)) (Last a6989586621679544266 ~> Last b6989586621679544267) -> Type) (a6989586621680338454 :: Last (a6989586621679544266 ~> b6989586621679544267)) = TFHelper_6989586621680338456Sym1 a6989586621680338454
type Apply (TFHelper_6989586621680338507Sym0 :: TyFun (Last a6989586621679544289) ((a6989586621679544289 ~> Last b6989586621679544290) ~> Last b6989586621679544290) -> Type) (a6989586621680338505 :: Last a6989586621679544289) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (TFHelper_6989586621680338507Sym0 :: TyFun (Last a6989586621679544289) ((a6989586621679544289 ~> Last b6989586621679544290) ~> Last b6989586621679544290) -> Type) (a6989586621680338505 :: Last a6989586621679544289) = (TFHelper_6989586621680338507Sym1 a6989586621680338505 b6989586621679544290 :: TyFun (a6989586621679544289 ~> Last b6989586621679544290) (Last b6989586621679544290) -> Type)
type Apply (Foldr_6989586621680532753Sym0 :: TyFun (a6989586621680450322 ~> (b6989586621680450323 ~> b6989586621680450323)) (b6989586621680450323 ~> (Last a6989586621680450322 ~> b6989586621680450323)) -> Type) (a6989586621680532750 :: a6989586621680450322 ~> (b6989586621680450323 ~> b6989586621680450323)) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Foldr_6989586621680532753Sym0 :: TyFun (a6989586621680450322 ~> (b6989586621680450323 ~> b6989586621680450323)) (b6989586621680450323 ~> (Last a6989586621680450322 ~> b6989586621680450323)) -> Type) (a6989586621680532750 :: a6989586621680450322 ~> (b6989586621680450323 ~> b6989586621680450323)) = Foldr_6989586621680532753Sym1 a6989586621680532750
type Apply (FoldMap_6989586621680532726Sym0 :: TyFun (a6989586621680450321 ~> m6989586621680450320) (Last a6989586621680450321 ~> m6989586621680450320) -> Type) (a6989586621680532724 :: a6989586621680450321 ~> m6989586621680450320) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (FoldMap_6989586621680532726Sym0 :: TyFun (a6989586621680450321 ~> m6989586621680450320) (Last a6989586621680450321 ~> m6989586621680450320) -> Type) (a6989586621680532724 :: a6989586621680450321 ~> m6989586621680450320) = FoldMap_6989586621680532726Sym1 a6989586621680532724
type Apply (Fmap_6989586621680338468Sym0 :: TyFun (a6989586621679544260 ~> b6989586621679544261) (Last a6989586621679544260 ~> Last b6989586621679544261) -> Type) (a6989586621680338466 :: a6989586621679544260 ~> b6989586621679544261) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (Fmap_6989586621680338468Sym0 :: TyFun (a6989586621679544260 ~> b6989586621679544261) (Last a6989586621679544260 ~> Last b6989586621679544261) -> Type) (a6989586621680338466 :: a6989586621679544260 ~> b6989586621679544261) = Fmap_6989586621680338468Sym1 a6989586621680338466
type Apply (Traverse_6989586621680754119Sym0 :: TyFun (a6989586621680747832 ~> f6989586621680747831 b6989586621680747833) (Last a6989586621680747832 ~> f6989586621680747831 (Last b6989586621680747833)) -> Type) (a6989586621680754117 :: a6989586621680747832 ~> f6989586621680747831 b6989586621680747833) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type Apply (Traverse_6989586621680754119Sym0 :: TyFun (a6989586621680747832 ~> f6989586621680747831 b6989586621680747833) (Last a6989586621680747832 ~> f6989586621680747831 (Last b6989586621680747833)) -> Type) (a6989586621680754117 :: a6989586621680747832 ~> f6989586621680747831 b6989586621680747833) = Traverse_6989586621680754119Sym1 a6989586621680754117
type Apply (Lambda_6989586621680338490Sym1 a6989586621680338488 :: TyFun (k1 ~> Last a) (TyFun k1 (Maybe a) -> Type) -> Type) (k6989586621680338489 :: k1 ~> Last a) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (Lambda_6989586621680338490Sym1 a6989586621680338488 :: TyFun (k1 ~> Last a) (TyFun k1 (Maybe a) -> Type) -> Type) (k6989586621680338489 :: k1 ~> Last a) = Lambda_6989586621680338490Sym2 a6989586621680338488 k6989586621680338489

newtype Ap (f :: k -> Type) (a :: k) :: forall k. (k -> Type) -> k -> Type #

This data type witnesses the lifting of a Monoid into an Applicative pointwise.

Since: base-4.12.0.0

Constructors

Ap 

Fields

Instances
Generic1 (Ap f :: k -> Type) 
Instance details

Defined in Data.Monoid

Associated Types

type Rep1 (Ap f) :: k -> Type #

Methods

from1 :: Ap f a -> Rep1 (Ap f) a #

to1 :: Rep1 (Ap f) a -> Ap f a #

Monad f => Monad (Ap f)

Since: base-4.12.0.0

Instance details

Defined in Data.Monoid

Methods

(>>=) :: Ap f a -> (a -> Ap f b) -> Ap f b #

(>>) :: Ap f a -> Ap f b -> Ap f b #

return :: a -> Ap f a #

fail :: String -> Ap f a #

Functor f => Functor (Ap f)

Since: base-4.12.0.0

Instance details

Defined in Data.Monoid

Methods

fmap :: (a -> b) -> Ap f a -> Ap f b #

(<$) :: a -> Ap f b -> Ap f a #

MonadFail f => MonadFail (Ap f)

Since: base-4.12.0.0

Instance details

Defined in Data.Monoid

Methods

fail :: String -> Ap f a #

Applicative f => Applicative (Ap f)

Since: base-4.12.0.0

Instance details

Defined in Data.Monoid

Methods

pure :: a -> Ap f a #

(<*>) :: Ap f (a -> b) -> Ap f a -> Ap f b #

liftA2 :: (a -> b -> c) -> Ap f a -> Ap f b -> Ap f c #

(*>) :: Ap f a -> Ap f b -> Ap f b #

(<*) :: Ap f a -> Ap f b -> Ap f a #

Foldable f => Foldable (Ap f)

Since: base-4.12.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => Ap f m -> m #

foldMap :: Monoid m => (a -> m) -> Ap f a -> m #

foldr :: (a -> b -> b) -> b -> Ap f a -> b #

foldr' :: (a -> b -> b) -> b -> Ap f a -> b #

foldl :: (b -> a -> b) -> b -> Ap f a -> b #

foldl' :: (b -> a -> b) -> b -> Ap f a -> b #

foldr1 :: (a -> a -> a) -> Ap f a -> a #

foldl1 :: (a -> a -> a) -> Ap f a -> a #

toList :: Ap f a -> [a] #

null :: Ap f a -> Bool #

length :: Ap f a -> Int #

elem :: Eq a => a -> Ap f a -> Bool #

maximum :: Ord a => Ap f a -> a #

minimum :: Ord a => Ap f a -> a #

sum :: Num a => Ap f a -> a #

product :: Num a => Ap f a -> a #

Traversable f => Traversable (Ap f)

Since: base-4.12.0.0

Instance details

Defined in Data.Traversable

Methods

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

sequenceA :: Applicative f0 => Ap f (f0 a) -> f0 (Ap f a) #

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

sequence :: Monad m => Ap f (m a) -> m (Ap f a) #

Alternative f => Alternative (Ap f)

Since: base-4.12.0.0

Instance details

Defined in Data.Monoid

Methods

empty :: Ap f a #

(<|>) :: Ap f a -> Ap f a -> Ap f a #

some :: Ap f a -> Ap f [a] #

many :: Ap f a -> Ap f [a] #

MonadPlus f => MonadPlus (Ap f)

Since: base-4.12.0.0

Instance details

Defined in Data.Monoid

Methods

mzero :: Ap f a #

mplus :: Ap f a -> Ap f a -> Ap f a #

(Applicative f, Bounded a) => Bounded (Ap f a)

Since: base-4.12.0.0

Instance details

Defined in Data.Monoid

Methods

minBound :: Ap f a #

maxBound :: Ap f a #

Enum (f a) => Enum (Ap f a)

Since: base-4.12.0.0

Instance details

Defined in Data.Monoid

Methods

succ :: Ap f a -> Ap f a #

pred :: Ap f a -> Ap f a #

toEnum :: Int -> Ap f a #

fromEnum :: Ap f a -> Int #

enumFrom :: Ap f a -> [Ap f a] #

enumFromThen :: Ap f a -> Ap f a -> [Ap f a] #

enumFromTo :: Ap f a -> Ap f a -> [Ap f a] #

enumFromThenTo :: Ap f a -> Ap f a -> Ap f a -> [Ap f a] #

Eq (f a) => Eq (Ap f a)

Since: base-4.12.0.0

Instance details

Defined in Data.Monoid

Methods

(==) :: Ap f a -> Ap f a -> Bool #

(/=) :: Ap f a -> Ap f a -> Bool #

(Applicative f, Num a) => Num (Ap f a)

Since: base-4.12.0.0

Instance details

Defined in Data.Monoid

Methods

(+) :: Ap f a -> Ap f a -> Ap f a #

(-) :: Ap f a -> Ap f a -> Ap f a #

(*) :: Ap f a -> Ap f a -> Ap f a #

negate :: Ap f a -> Ap f a #

abs :: Ap f a -> Ap f a #

signum :: Ap f a -> Ap f a #

fromInteger :: Integer -> Ap f a #

Ord (f a) => Ord (Ap f a)

Since: base-4.12.0.0

Instance details

Defined in Data.Monoid

Methods

compare :: Ap f a -> Ap f a -> Ordering #

(<) :: Ap f a -> Ap f a -> Bool #

(<=) :: Ap f a -> Ap f a -> Bool #

(>) :: Ap f a -> Ap f a -> Bool #

(>=) :: Ap f a -> Ap f a -> Bool #

max :: Ap f a -> Ap f a -> Ap f a #

min :: Ap f a -> Ap f a -> Ap f a #

Read (f a) => Read (Ap f a)

Since: base-4.12.0.0

Instance details

Defined in Data.Monoid

Methods

readsPrec :: Int -> ReadS (Ap f a) #

readList :: ReadS [Ap f a] #

readPrec :: ReadPrec (Ap f a) #

readListPrec :: ReadPrec [Ap f a] #

Show (f a) => Show (Ap f a)

Since: base-4.12.0.0

Instance details

Defined in Data.Monoid

Methods

showsPrec :: Int -> Ap f a -> ShowS #

show :: Ap f a -> String #

showList :: [Ap f a] -> ShowS #

Generic (Ap f a) 
Instance details

Defined in Data.Monoid

Associated Types

type Rep (Ap f a) :: Type -> Type #

Methods

from :: Ap f a -> Rep (Ap f a) x #

to :: Rep (Ap f a) x -> Ap f a #

(Applicative f, Semigroup a) => Semigroup (Ap f a)

Since: base-4.12.0.0

Instance details

Defined in Data.Monoid

Methods

(<>) :: Ap f a -> Ap f a -> Ap f a #

sconcat :: NonEmpty (Ap f a) -> Ap f a #

stimes :: Integral b => b -> Ap f a -> Ap f a #

(Applicative f, Monoid a) => Monoid (Ap f a)

Since: base-4.12.0.0

Instance details

Defined in Data.Monoid

Methods

mempty :: Ap f a #

mappend :: Ap f a -> Ap f a -> Ap f a #

mconcat :: [Ap f a] -> Ap f a #

type Rep1 (Ap f :: k -> Type)

Since: base-4.12.0.0

Instance details

Defined in Data.Monoid

type Rep1 (Ap f :: k -> Type) = D1 (MetaData "Ap" "Data.Monoid" "base" True) (C1 (MetaCons "Ap" PrefixI True) (S1 (MetaSel (Just "getAp") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec1 f)))
type Rep (Ap f a)

Since: base-4.12.0.0

Instance details

Defined in Data.Monoid

type Rep (Ap f a) = D1 (MetaData "Ap" "Data.Monoid" "base" True) (C1 (MetaCons "Ap" PrefixI True) (S1 (MetaSel (Just "getAp") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (f a))))

newtype Dual a #

The dual of a Monoid, obtained by swapping the arguments of mappend.

>>> getDual (mappend (Dual "Hello") (Dual "World"))
"WorldHello"

Constructors

Dual 

Fields

Instances
Monad Dual

Since: base-4.8.0.0

Instance details

Defined in Data.Semigroup.Internal

Methods

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

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

return :: a -> Dual a #

fail :: String -> Dual a #

Functor Dual

Since: base-4.8.0.0

Instance details

Defined in Data.Semigroup.Internal

Methods

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

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

Applicative Dual

Since: base-4.8.0.0

Instance details

Defined in Data.Semigroup.Internal

Methods

pure :: a -> Dual a #

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

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

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

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

Foldable Dual

Since: base-4.8.0.0

Instance details

Defined in Data.Foldable

Methods

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

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

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

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

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

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

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

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

toList :: Dual a -> [a] #

null :: Dual a -> Bool #

length :: Dual a -> Int #

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

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

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

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

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

Traversable Dual

Since: base-4.8.0.0

Instance details

Defined in Data.Traversable

Methods

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

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

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

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

PTraversable Dual 
Instance details

Defined in Data.Singletons.Prelude.Traversable

Associated Types

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

type SequenceA arg :: f (t a) #

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

type Sequence arg :: m (t a) #

STraversable Dual 
Instance details

Defined in Data.Singletons.Prelude.Traversable

Methods

sTraverse :: SApplicative f => Sing t1 -> Sing t2 -> Sing (Apply (Apply TraverseSym0 t1) t2) #

sSequenceA :: SApplicative f => Sing t1 -> Sing (Apply SequenceASym0 t1) #

sMapM :: SMonad m => Sing t1 -> Sing t2 -> Sing (Apply (Apply MapMSym0 t1) t2) #

sSequence :: SMonad m => Sing t1 -> Sing (Apply SequenceSym0 t1) #

PFoldable Dual 
Instance details

Defined in Data.Singletons.Prelude.Foldable

Associated Types

type Fold arg :: m #

type FoldMap arg arg1 :: m #

type Foldr arg arg1 arg2 :: b #

type Foldr' arg arg1 arg2 :: b #

type Foldl arg arg1 arg2 :: b #

type Foldl' arg arg1 arg2 :: b #

type Foldr1 arg arg1 :: a #

type Foldl1 arg arg1 :: a #

type ToList arg :: [a] #

type Null arg :: Bool #

type Length arg :: Nat #

type Elem arg arg1 :: Bool #

type Maximum arg :: a #

type Minimum arg :: a #

type Sum arg :: a #

type Product arg :: a #

SFoldable Dual 
Instance details

Defined in Data.Singletons.Prelude.Foldable

Methods

sFold :: SMonoid m => Sing t1 -> Sing (Apply FoldSym0 t1) #

sFoldMap :: SMonoid m => Sing t1 -> Sing t2 -> Sing (Apply (Apply FoldMapSym0 t1) t2) #

sFoldr :: Sing t1 -> Sing t2 -> Sing t3 -> Sing (Apply (Apply (Apply FoldrSym0 t1) t2) t3) #

sFoldr' :: Sing t1 -> Sing t2 -> Sing t3 -> Sing (Apply (Apply (Apply Foldr'Sym0 t1) t2) t3) #

sFoldl :: Sing t1 -> Sing t2 -> Sing t3 -> Sing (Apply (Apply (Apply FoldlSym0 t1) t2) t3) #

sFoldl' :: Sing t1 -> Sing t2 -> Sing t3 -> Sing (Apply (Apply (Apply Foldl'Sym0 t1) t2) t3) #

sFoldr1 :: Sing t1 -> Sing t2 -> Sing (Apply (Apply Foldr1Sym0 t1) t2) #

sFoldl1 :: Sing t1 -> Sing t2 -> Sing (Apply (Apply Foldl1Sym0 t1) t2) #

sToList :: Sing t1 -> Sing (Apply ToListSym0 t1) #

sNull :: Sing t1 -> Sing (Apply NullSym0 t1) #

sLength :: Sing t1 -> Sing (Apply LengthSym0 t1) #

sElem :: SEq a => Sing t1 -> Sing t2 -> Sing (Apply (Apply ElemSym0 t1) t2) #

sMaximum :: SOrd a => Sing t1 -> Sing (Apply MaximumSym0 t1) #

sMinimum :: SOrd a => Sing t1 -> Sing (Apply MinimumSym0 t1) #

sSum :: SNum a => Sing t1 -> Sing (Apply SumSym0 t1) #

sProduct :: SNum a => Sing t1 -> Sing (Apply ProductSym0 t1) #

Bounded a => Bounded (Dual a)

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Methods

minBound :: Dual a #

maxBound :: Dual a #

Eq a => Eq (Dual a)

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Methods

(==) :: Dual a -> Dual a -> Bool #

(/=) :: Dual a -> Dual a -> Bool #

Ord a => Ord (Dual a)

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Methods

compare :: Dual a -> Dual a -> Ordering #

(<) :: Dual a -> Dual a -> Bool #

(<=) :: Dual a -> Dual a -> Bool #

(>) :: Dual a -> Dual a -> Bool #

(>=) :: Dual a -> Dual a -> Bool #

max :: Dual a -> Dual a -> Dual a #

min :: Dual a -> Dual a -> Dual a #

Read a => Read (Dual a)

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Show a => Show (Dual a)

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Methods

showsPrec :: Int -> Dual a -> ShowS #

show :: Dual a -> String #

showList :: [Dual a] -> ShowS #

Generic (Dual a) 
Instance details

Defined in Data.Semigroup.Internal

Associated Types

type Rep (Dual a) :: Type -> Type #

Methods

from :: Dual a -> Rep (Dual a) x #

to :: Rep (Dual a) x -> Dual a #

Semigroup a => Semigroup (Dual a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup.Internal

Methods

(<>) :: Dual a -> Dual a -> Dual a #

sconcat :: NonEmpty (Dual a) -> Dual a #

stimes :: Integral b => b -> Dual a -> Dual a #

Monoid a => Monoid (Dual a)

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Methods

mempty :: Dual a #

mappend :: Dual a -> Dual a -> Dual a #

mconcat :: [Dual a] -> Dual a #

Default a => Default (Dual a) 
Instance details

Defined in Data.Default.Class

Methods

def :: Dual a #

PMonoid (Dual a) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

Associated Types

type Mempty :: a #

type Mappend arg arg1 :: a #

type Mconcat arg :: a #

SMonoid a => SMonoid (Dual a) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

PSemigroup (Dual a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

Associated Types

type arg <> arg1 :: a #

type Sconcat arg :: a #

SSemigroup a => SSemigroup (Dual a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

Methods

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

sSconcat :: Sing t -> Sing (Apply SconcatSym0 t) #

Generic1 Dual 
Instance details

Defined in Data.Semigroup.Internal

Associated Types

type Rep1 Dual :: k -> Type #

Methods

from1 :: Dual a -> Rep1 Dual a #

to1 :: Rep1 Dual a -> Dual a #

SuppressUnusedWarnings (ShowsPrec_6989586621680865175Sym0 :: TyFun Nat (Dual a6989586621679072595 ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (Pure_6989586621679837713Sym0 :: TyFun a6989586621679544265 (Dual a6989586621679544265) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (DualSym0 :: TyFun a6989586621679072595 (Dual a6989586621679072595) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (TFHelper_6989586621679837779Sym0 :: TyFun (Dual a6989586621679837570) (Dual a6989586621679837570 ~> Dual a6989586621679837570) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (GetDualSym0 :: TyFun (Dual a6989586621679072595) a6989586621679072595 -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (Compare_6989586621679829373Sym0 :: TyFun (Dual a6989586621679072595) (Dual a6989586621679072595 ~> Ordering) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SingI (DualSym0 :: TyFun a (Dual a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

Methods

sing :: Sing DualSym0 #

SuppressUnusedWarnings (TFHelper_6989586621679837755Sym0 :: TyFun a6989586621679544262 (Dual b6989586621679544263 ~> Dual a6989586621679544262) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (ShowsPrec_6989586621680865175Sym1 a6989586621680865172 a6989586621679072595 :: TyFun (Dual a6989586621679072595) (Symbol ~> Symbol) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (TFHelper_6989586621679837779Sym1 a6989586621679837777 :: TyFun (Dual a6989586621679837570) (Dual a6989586621679837570) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (TFHelper_6989586621679837767Sym0 :: TyFun (Dual a6989586621679544289) ((a6989586621679544289 ~> Dual b6989586621679544290) ~> Dual b6989586621679544290) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (Compare_6989586621679829373Sym1 a6989586621679829371 :: TyFun (Dual a6989586621679072595) Ordering -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (TFHelper_6989586621679837724Sym0 :: TyFun (Dual (a6989586621679544266 ~> b6989586621679544267)) (Dual a6989586621679544266 ~> Dual b6989586621679544267) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (Fmap_6989586621679837736Sym0 :: TyFun (a6989586621679544260 ~> b6989586621679544261) (Dual a6989586621679544260 ~> Dual b6989586621679544261) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (TFHelper_6989586621679837755Sym1 a6989586621679837753 b6989586621679544263 :: TyFun (Dual b6989586621679544263) (Dual a6989586621679544262) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (TFHelper_6989586621679837724Sym1 a6989586621679837722 :: TyFun (Dual a6989586621679544266) (Dual b6989586621679544267) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (Fmap_6989586621679837736Sym1 a6989586621679837734 :: TyFun (Dual a6989586621679544260) (Dual b6989586621679544261) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (Traverse_6989586621680754071Sym0 :: TyFun (a6989586621680747832 ~> f6989586621680747831 b6989586621680747833) (Dual a6989586621680747832 ~> f6989586621680747831 (Dual b6989586621680747833)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

SuppressUnusedWarnings (TFHelper_6989586621679837767Sym1 a6989586621679837765 b6989586621679544290 :: TyFun (a6989586621679544289 ~> Dual b6989586621679544290) (Dual b6989586621679544290) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (Traverse_6989586621680754071Sym1 a6989586621680754069 :: TyFun (Dual a6989586621680747832) (f6989586621680747831 (Dual b6989586621680747833)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

SuppressUnusedWarnings (Let6989586621680451084Scrutinee_6989586621680450533Sym0 :: TyFun (a ~> (a6989586621680450321 ~> a)) (TyFun k (TyFun (t6989586621680450318 a6989586621680450321) (Dual (Endo a)) -> Type) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (Let6989586621680451084Scrutinee_6989586621680450533Sym1 f6989586621680451081 :: TyFun k (TyFun (t6989586621680450318 a6989586621680450321) (Dual (Endo a)) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (Let6989586621680451084Scrutinee_6989586621680450533Sym2 z6989586621680451082 f6989586621680451081 :: TyFun (t6989586621680450318 a6989586621680450321) (Dual (Endo a)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Product (a :: Dual k2) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

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

Defined in Data.Singletons.Prelude.Foldable

type Sum (a :: Dual k2) = Apply (Sum_6989586621680451841Sym0 :: TyFun (Dual k2) k2 -> Type) a
type Minimum (a :: Dual k2) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Minimum (a :: Dual k2) = Apply (Minimum_6989586621680451821Sym0 :: TyFun (Dual k2) k2 -> Type) a
type Maximum (a :: Dual k2) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Maximum (a :: Dual k2) = Apply (Maximum_6989586621680451814Sym0 :: TyFun (Dual k2) k2 -> Type) a
type Length (a :: Dual a6989586621680450334) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Length (a :: Dual a6989586621680450334) = Apply (Length_6989586621680451807Sym0 :: TyFun (Dual a6989586621680450334) Nat -> Type) a
type Null (a :: Dual a6989586621680450333) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Null (a :: Dual a6989586621680450333) = Apply (Null_6989586621680451827Sym0 :: TyFun (Dual a6989586621680450333) Bool -> Type) a
type ToList (a :: Dual a6989586621680450332) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type ToList (a :: Dual a6989586621680450332) = Apply (ToList_6989586621680451848Sym0 :: TyFun (Dual a6989586621680450332) [a6989586621680450332] -> Type) a
type Fold (arg :: Dual m) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Fold (arg :: Dual m) = Apply (Fold_6989586621680451003Sym0 :: TyFun (Dual m) m -> Type) arg
type Pure (a :: k1) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Pure (a :: k1) = Apply (Pure_6989586621679837713Sym0 :: TyFun k1 (Dual k1) -> Type) a
type Fail arg 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Fail arg = Apply (Fail_6989586621679544807Sym0 :: TyFun Symbol (Dual a) -> Type) arg
type Return (arg :: a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Return (arg :: a) = Apply (Return_6989586621679544800Sym0 :: TyFun a (Dual a) -> Type) arg
type Sequence (arg :: Dual (m a)) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type Sequence (arg :: Dual (m a)) = Apply (Sequence_6989586621680747899Sym0 :: TyFun (Dual (m a)) (m (Dual a)) -> Type) arg
type SequenceA (arg :: Dual (f a)) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type SequenceA (arg :: Dual (f a)) = Apply (SequenceA_6989586621680747874Sym0 :: TyFun (Dual (f a)) (f (Dual a)) -> Type) arg
type Elem (a1 :: k1) (a2 :: Dual k1) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

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

Defined in Data.Singletons.Prelude.Foldable

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

Defined in Data.Singletons.Prelude.Foldable

type Foldr1 (a1 :: k2 ~> (k2 ~> k2)) (a2 :: Dual k2) = Apply (Apply (Foldr1_6989586621680451800Sym0 :: TyFun (k2 ~> (k2 ~> k2)) (Dual k2 ~> k2) -> Type) a1) a2
type FoldMap (a1 :: a6989586621680450321 ~> k2) (a2 :: Dual a6989586621680450321) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type FoldMap (a1 :: a6989586621680450321 ~> k2) (a2 :: Dual a6989586621680450321) = Apply (Apply (FoldMap_6989586621680451692Sym0 :: TyFun (a6989586621680450321 ~> k2) (Dual a6989586621680450321 ~> k2) -> Type) a1) a2
type (a1 :: k1) <$ (a2 :: Dual b6989586621679544263) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type (a1 :: k1) <$ (a2 :: Dual b6989586621679544263) = Apply (Apply (TFHelper_6989586621679837755Sym0 :: TyFun k1 (Dual b6989586621679544263 ~> Dual k1) -> Type) a1) a2
type Fmap (a1 :: a6989586621679544260 ~> b6989586621679544261) (a2 :: Dual a6989586621679544260) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Fmap (a1 :: a6989586621679544260 ~> b6989586621679544261) (a2 :: Dual a6989586621679544260) = Apply (Apply (Fmap_6989586621679837736Sym0 :: TyFun (a6989586621679544260 ~> b6989586621679544261) (Dual a6989586621679544260 ~> Dual b6989586621679544261) -> Type) a1) a2
type (arg1 :: Dual a) <* (arg2 :: Dual b) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

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

Defined in Data.Singletons.Prelude.Semigroup.Internal

type (arg1 :: Dual a) *> (arg2 :: Dual b) = Apply (Apply (TFHelper_6989586621679544740Sym0 :: TyFun (Dual a) (Dual b ~> Dual b) -> Type) arg1) arg2
type (a1 :: Dual (a6989586621679544266 ~> b6989586621679544267)) <*> (a2 :: Dual a6989586621679544266) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type (a1 :: Dual (a6989586621679544266 ~> b6989586621679544267)) <*> (a2 :: Dual a6989586621679544266) = Apply (Apply (TFHelper_6989586621679837724Sym0 :: TyFun (Dual (a6989586621679544266 ~> b6989586621679544267)) (Dual a6989586621679544266 ~> Dual b6989586621679544267) -> Type) a1) a2
type (arg1 :: Dual a) >> (arg2 :: Dual b) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type (arg1 :: Dual a) >> (arg2 :: Dual b) = Apply (Apply (TFHelper_6989586621679544790Sym0 :: TyFun (Dual a) (Dual b ~> Dual b) -> Type) arg1) arg2
type (a1 :: Dual a6989586621679544289) >>= (a2 :: a6989586621679544289 ~> Dual b6989586621679544290) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type (a1 :: Dual a6989586621679544289) >>= (a2 :: a6989586621679544289 ~> Dual b6989586621679544290) = Apply (Apply (TFHelper_6989586621679837767Sym0 :: TyFun (Dual a6989586621679544289) ((a6989586621679544289 ~> Dual b6989586621679544290) ~> Dual b6989586621679544290) -> Type) a1) a2
type MapM (arg1 :: a ~> m b) (arg2 :: Dual a) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type MapM (arg1 :: a ~> m b) (arg2 :: Dual a) = Apply (Apply (MapM_6989586621680747889Sym0 :: TyFun (a ~> m b) (Dual a ~> m (Dual b)) -> Type) arg1) arg2
type Traverse (a1 :: a6989586621680747832 ~> f6989586621680747831 b6989586621680747833) (a2 :: Dual a6989586621680747832) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type Traverse (a1 :: a6989586621680747832 ~> f6989586621680747831 b6989586621680747833) (a2 :: Dual a6989586621680747832) = Apply (Apply (Traverse_6989586621680754071Sym0 :: TyFun (a6989586621680747832 ~> f6989586621680747831 b6989586621680747833) (Dual a6989586621680747832 ~> f6989586621680747831 (Dual b6989586621680747833)) -> Type) a1) a2
type Foldl' (a1 :: k2 ~> (a6989586621680450329 ~> k2)) (a2 :: k2) (a3 :: Dual a6989586621680450329) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Foldl' (a1 :: k2 ~> (a6989586621680450329 ~> k2)) (a2 :: k2) (a3 :: Dual a6989586621680450329) = Apply (Apply (Apply (Foldl'_6989586621680451737Sym0 :: TyFun (k2 ~> (a6989586621680450329 ~> k2)) (k2 ~> (Dual a6989586621680450329 ~> k2)) -> Type) a1) a2) a3
type Foldl (a1 :: k2 ~> (a6989586621680450327 ~> k2)) (a2 :: k2) (a3 :: Dual a6989586621680450327) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Foldl (a1 :: k2 ~> (a6989586621680450327 ~> k2)) (a2 :: k2) (a3 :: Dual a6989586621680450327) = Apply (Apply (Apply (Foldl_6989586621680451720Sym0 :: TyFun (k2 ~> (a6989586621680450327 ~> k2)) (k2 ~> (Dual a6989586621680450327 ~> k2)) -> Type) a1) a2) a3
type Foldr' (a1 :: a6989586621680450324 ~> (k2 ~> k2)) (a2 :: k2) (a3 :: Dual a6989586621680450324) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Foldr' (a1 :: a6989586621680450324 ~> (k2 ~> k2)) (a2 :: k2) (a3 :: Dual a6989586621680450324) = Apply (Apply (Apply (Foldr'_6989586621680451788Sym0 :: TyFun (a6989586621680450324 ~> (k2 ~> k2)) (k2 ~> (Dual a6989586621680450324 ~> k2)) -> Type) a1) a2) a3
type Foldr (a1 :: a6989586621680450322 ~> (k2 ~> k2)) (a2 :: k2) (a3 :: Dual a6989586621680450322) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Foldr (a1 :: a6989586621680450322 ~> (k2 ~> k2)) (a2 :: k2) (a3 :: Dual a6989586621680450322) = Apply (Apply (Apply (Foldr_6989586621680451765Sym0 :: TyFun (a6989586621680450322 ~> (k2 ~> k2)) (k2 ~> (Dual a6989586621680450322 ~> k2)) -> Type) a1) a2) a3
type LiftA2 (arg1 :: a ~> (b ~> c)) (arg2 :: Dual a) (arg3 :: Dual b) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type LiftA2 (arg1 :: a ~> (b ~> c)) (arg2 :: Dual a) (arg3 :: Dual b) = Apply (Apply (Apply (LiftA2_6989586621679544727Sym0 :: TyFun (a ~> (b ~> c)) (Dual a ~> (Dual b ~> Dual c)) -> Type) arg1) arg2) arg3
type Apply (GetDualSym0 :: TyFun (Dual a) a -> Type) (a6989586621679819777 :: Dual a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (GetDualSym0 :: TyFun (Dual a) a -> Type) (a6989586621679819777 :: Dual a) = GetDual a6989586621679819777
type Apply (Compare_6989586621679829373Sym1 a6989586621679829371 :: TyFun (Dual a) Ordering -> Type) (a6989586621679829372 :: Dual a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (Compare_6989586621679829373Sym1 a6989586621679829371 :: TyFun (Dual a) Ordering -> Type) (a6989586621679829372 :: Dual a) = Compare_6989586621679829373 a6989586621679829371 a6989586621679829372
type Rep (Dual a)

Since: base-4.7.0.0

Instance details

Defined in Data.Semigroup.Internal

type Rep (Dual a) = D1 (MetaData "Dual" "Data.Semigroup.Internal" "base" True) (C1 (MetaCons "Dual" PrefixI True) (S1 (MetaSel (Just "getDual") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a)))
type Mempty 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Mempty = (Mempty_6989586621680338339Sym0 :: Dual a)
type MaxBound 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type MaxBound = (MaxBound_6989586621679825272Sym0 :: Dual a)
type MinBound 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type MinBound = (MinBound_6989586621679825270Sym0 :: Dual a)
data Sing (b :: Dual a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

data Sing (b :: Dual a) where
type Demote (Dual a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Demote (Dual a) = Dual (Demote a)
type Rep1 Dual

Since: base-4.7.0.0

Instance details

Defined in Data.Semigroup.Internal

type Rep1 Dual = D1 (MetaData "Dual" "Data.Semigroup.Internal" "base" True) (C1 (MetaCons "Dual" PrefixI True) (S1 (MetaSel (Just "getDual") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1))
type Mconcat (arg :: [Dual a]) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Mconcat (arg :: [Dual a]) = Apply (Mconcat_6989586621680328808Sym0 :: TyFun [Dual a] (Dual a) -> Type) arg
type Show_ (arg :: Dual a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Show_ (arg :: Dual a) = Apply (Show__6989586621680262307Sym0 :: TyFun (Dual a) Symbol -> Type) arg
type Sconcat (arg :: NonEmpty (Dual a)) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Sconcat (arg :: NonEmpty (Dual a)) = Apply (Sconcat_6989586621679810578Sym0 :: TyFun (NonEmpty (Dual a)) (Dual a) -> Type) arg
type Mappend (arg1 :: Dual a) (arg2 :: Dual a) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Mappend (arg1 :: Dual a) (arg2 :: Dual a) = Apply (Apply (Mappend_6989586621680328798Sym0 :: TyFun (Dual a) (Dual a ~> Dual a) -> Type) arg1) arg2
type ShowList (arg1 :: [Dual a]) arg2 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type ShowList (arg1 :: [Dual a]) arg2 = Apply (Apply (ShowList_6989586621680262318Sym0 :: TyFun [Dual a] (Symbol ~> Symbol) -> Type) arg1) arg2
type (a2 :: Dual a1) <> (a3 :: Dual a1) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type (a2 :: Dual a1) <> (a3 :: Dual a1) = Apply (Apply (TFHelper_6989586621679837779Sym0 :: TyFun (Dual a1) (Dual a1 ~> Dual a1) -> Type) a2) a3
type Min (arg1 :: Dual a) (arg2 :: Dual a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Min (arg1 :: Dual a) (arg2 :: Dual a) = Apply (Apply (Min_6989586621679379811Sym0 :: TyFun (Dual a) (Dual a ~> Dual a) -> Type) arg1) arg2
type Max (arg1 :: Dual a) (arg2 :: Dual a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Max (arg1 :: Dual a) (arg2 :: Dual a) = Apply (Apply (Max_6989586621679379793Sym0 :: TyFun (Dual a) (Dual a ~> Dual a) -> Type) arg1) arg2
type (arg1 :: Dual a) >= (arg2 :: Dual a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type (arg1 :: Dual a) >= (arg2 :: Dual a) = Apply (Apply (TFHelper_6989586621679379775Sym0 :: TyFun (Dual a) (Dual a ~> Bool) -> Type) arg1) arg2
type (arg1 :: Dual a) > (arg2 :: Dual a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type (arg1 :: Dual a) > (arg2 :: Dual a) = Apply (Apply (TFHelper_6989586621679379757Sym0 :: TyFun (Dual a) (Dual a ~> Bool) -> Type) arg1) arg2
type (arg1 :: Dual a) <= (arg2 :: Dual a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type (arg1 :: Dual a) <= (arg2 :: Dual a) = Apply (Apply (TFHelper_6989586621679379739Sym0 :: TyFun (Dual a) (Dual a ~> Bool) -> Type) arg1) arg2
type (arg1 :: Dual a) < (arg2 :: Dual a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type (arg1 :: Dual a) < (arg2 :: Dual a) = Apply (Apply (TFHelper_6989586621679379721Sym0 :: TyFun (Dual a) (Dual a ~> Bool) -> Type) arg1) arg2
type Compare (a2 :: Dual a1) (a3 :: Dual a1) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Compare (a2 :: Dual a1) (a3 :: Dual a1) = Apply (Apply (Compare_6989586621679829373Sym0 :: TyFun (Dual a1) (Dual a1 ~> Ordering) -> Type) a2) a3
type (x :: Dual a) /= (y :: Dual a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type (x :: Dual a) /= (y :: Dual a) = Not (x == y)
type (a2 :: Dual a1) == (b :: Dual a1) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type (a2 :: Dual a1) == (b :: Dual a1) = Equals_6989586621679827084 a2 b
type ShowsPrec a2 (a3 :: Dual a1) a4 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type ShowsPrec a2 (a3 :: Dual a1) a4 = Apply (Apply (Apply (ShowsPrec_6989586621680865175Sym0 :: TyFun Nat (Dual a1 ~> (Symbol ~> Symbol)) -> Type) a2) a3) a4
type Apply (DualSym0 :: TyFun a (Dual a) -> Type) (t6989586621679819780 :: a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (DualSym0 :: TyFun a (Dual a) -> Type) (t6989586621679819780 :: a) = Dual t6989586621679819780
type Apply (Pure_6989586621679837713Sym0 :: TyFun a (Dual a) -> Type) (a6989586621679837712 :: a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (Pure_6989586621679837713Sym0 :: TyFun a (Dual a) -> Type) (a6989586621679837712 :: a) = Pure_6989586621679837713 a6989586621679837712
type Apply (TFHelper_6989586621679837779Sym1 a6989586621679837777 :: TyFun (Dual a) (Dual a) -> Type) (a6989586621679837778 :: Dual a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (TFHelper_6989586621679837779Sym1 a6989586621679837777 :: TyFun (Dual a) (Dual a) -> Type) (a6989586621679837778 :: Dual a) = TFHelper_6989586621679837779 a6989586621679837777 a6989586621679837778
type Apply (TFHelper_6989586621679837724Sym1 a6989586621679837722 :: TyFun (Dual a) (Dual b) -> Type) (a6989586621679837723 :: Dual a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (TFHelper_6989586621679837724Sym1 a6989586621679837722 :: TyFun (Dual a) (Dual b) -> Type) (a6989586621679837723 :: Dual a) = TFHelper_6989586621679837724 a6989586621679837722 a6989586621679837723
type Apply (Fmap_6989586621679837736Sym1 a6989586621679837734 :: TyFun (Dual a) (Dual b) -> Type) (a6989586621679837735 :: Dual a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (Fmap_6989586621679837736Sym1 a6989586621679837734 :: TyFun (Dual a) (Dual b) -> Type) (a6989586621679837735 :: Dual a) = Fmap_6989586621679837736 a6989586621679837734 a6989586621679837735
type Apply (TFHelper_6989586621679837755Sym1 a6989586621679837753 b :: TyFun (Dual b) (Dual a) -> Type) (a6989586621679837754 :: Dual b) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (TFHelper_6989586621679837755Sym1 a6989586621679837753 b :: TyFun (Dual b) (Dual a) -> Type) (a6989586621679837754 :: Dual b) = TFHelper_6989586621679837755 a6989586621679837753 a6989586621679837754
type Apply (Traverse_6989586621680754071Sym1 a6989586621680754069 :: TyFun (Dual a) (f (Dual b)) -> Type) (a6989586621680754070 :: Dual a) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type Apply (Traverse_6989586621680754071Sym1 a6989586621680754069 :: TyFun (Dual a) (f (Dual b)) -> Type) (a6989586621680754070 :: Dual a) = Traverse_6989586621680754071 a6989586621680754069 a6989586621680754070
type Apply (Let6989586621680451084Scrutinee_6989586621680450533Sym2 z6989586621680451082 f6989586621680451081 :: TyFun (t6989586621680450318 a6989586621680450321) (Dual (Endo a)) -> Type) (t6989586621680451083 :: t6989586621680450318 a6989586621680450321) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Let6989586621680451084Scrutinee_6989586621680450533Sym2 z6989586621680451082 f6989586621680451081 :: TyFun (t6989586621680450318 a6989586621680450321) (Dual (Endo a)) -> Type) (t6989586621680451083 :: t6989586621680450318 a6989586621680450321) = Let6989586621680451084Scrutinee_6989586621680450533 z6989586621680451082 f6989586621680451081 t6989586621680451083
type Apply (TFHelper_6989586621679837767Sym1 a6989586621679837765 b :: TyFun (a ~> Dual b) (Dual b) -> Type) (a6989586621679837766 :: a ~> Dual b) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (TFHelper_6989586621679837767Sym1 a6989586621679837765 b :: TyFun (a ~> Dual b) (Dual b) -> Type) (a6989586621679837766 :: a ~> Dual b) = TFHelper_6989586621679837767 a6989586621679837765 a6989586621679837766
type Apply (ShowsPrec_6989586621680865175Sym0 :: TyFun Nat (Dual a6989586621679072595 ~> (Symbol ~> Symbol)) -> Type) (a6989586621680865172 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ShowsPrec_6989586621680865175Sym0 :: TyFun Nat (Dual a6989586621679072595 ~> (Symbol ~> Symbol)) -> Type) (a6989586621680865172 :: Nat) = (ShowsPrec_6989586621680865175Sym1 a6989586621680865172 a6989586621679072595 :: TyFun (Dual a6989586621679072595) (Symbol ~> Symbol) -> Type)
type Apply (TFHelper_6989586621679837755Sym0 :: TyFun a6989586621679544262 (Dual b6989586621679544263 ~> Dual a6989586621679544262) -> Type) (a6989586621679837753 :: a6989586621679544262) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (TFHelper_6989586621679837755Sym0 :: TyFun a6989586621679544262 (Dual b6989586621679544263 ~> Dual a6989586621679544262) -> Type) (a6989586621679837753 :: a6989586621679544262) = (TFHelper_6989586621679837755Sym1 a6989586621679837753 b6989586621679544263 :: TyFun (Dual b6989586621679544263) (Dual a6989586621679544262) -> Type)
type Apply (Let6989586621680451084Scrutinee_6989586621680450533Sym1 f6989586621680451081 :: TyFun k (TyFun (t6989586621680450318 a6989586621680450321) (Dual (Endo a)) -> Type) -> Type) (z6989586621680451082 :: k) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Let6989586621680451084Scrutinee_6989586621680450533Sym1 f6989586621680451081 :: TyFun k (TyFun (t6989586621680450318 a6989586621680450321) (Dual (Endo a)) -> Type) -> Type) (z6989586621680451082 :: k) = (Let6989586621680451084Scrutinee_6989586621680450533Sym2 f6989586621680451081 z6989586621680451082 :: TyFun (t6989586621680450318 a6989586621680450321) (Dual (Endo a)) -> Type)
type Apply (Compare_6989586621679829373Sym0 :: TyFun (Dual a6989586621679072595) (Dual a6989586621679072595 ~> Ordering) -> Type) (a6989586621679829371 :: Dual a6989586621679072595) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (Compare_6989586621679829373Sym0 :: TyFun (Dual a6989586621679072595) (Dual a6989586621679072595 ~> Ordering) -> Type) (a6989586621679829371 :: Dual a6989586621679072595) = Compare_6989586621679829373Sym1 a6989586621679829371
type Apply (TFHelper_6989586621679837779Sym0 :: TyFun (Dual a6989586621679837570) (Dual a6989586621679837570 ~> Dual a6989586621679837570) -> Type) (a6989586621679837777 :: Dual a6989586621679837570) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (TFHelper_6989586621679837779Sym0 :: TyFun (Dual a6989586621679837570) (Dual a6989586621679837570 ~> Dual a6989586621679837570) -> Type) (a6989586621679837777 :: Dual a6989586621679837570) = TFHelper_6989586621679837779Sym1 a6989586621679837777
type Apply (ShowsPrec_6989586621680865175Sym1 a6989586621680865172 a6989586621679072595 :: TyFun (Dual a6989586621679072595) (Symbol ~> Symbol) -> Type) (a6989586621680865173 :: Dual a6989586621679072595) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ShowsPrec_6989586621680865175Sym1 a6989586621680865172 a6989586621679072595 :: TyFun (Dual a6989586621679072595) (Symbol ~> Symbol) -> Type) (a6989586621680865173 :: Dual a6989586621679072595) = ShowsPrec_6989586621680865175Sym2 a6989586621680865172 a6989586621680865173
type Apply (TFHelper_6989586621679837724Sym0 :: TyFun (Dual (a6989586621679544266 ~> b6989586621679544267)) (Dual a6989586621679544266 ~> Dual b6989586621679544267) -> Type) (a6989586621679837722 :: Dual (a6989586621679544266 ~> b6989586621679544267)) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (TFHelper_6989586621679837724Sym0 :: TyFun (Dual (a6989586621679544266 ~> b6989586621679544267)) (Dual a6989586621679544266 ~> Dual b6989586621679544267) -> Type) (a6989586621679837722 :: Dual (a6989586621679544266 ~> b6989586621679544267)) = TFHelper_6989586621679837724Sym1 a6989586621679837722
type Apply (TFHelper_6989586621679837767Sym0 :: TyFun (Dual a6989586621679544289) ((a6989586621679544289 ~> Dual b6989586621679544290) ~> Dual b6989586621679544290) -> Type) (a6989586621679837765 :: Dual a6989586621679544289) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (TFHelper_6989586621679837767Sym0 :: TyFun (Dual a6989586621679544289) ((a6989586621679544289 ~> Dual b6989586621679544290) ~> Dual b6989586621679544290) -> Type) (a6989586621679837765 :: Dual a6989586621679544289) = (TFHelper_6989586621679837767Sym1 a6989586621679837765 b6989586621679544290 :: TyFun (a6989586621679544289 ~> Dual b6989586621679544290) (Dual b6989586621679544290) -> Type)
type Apply (Fmap_6989586621679837736Sym0 :: TyFun (a6989586621679544260 ~> b6989586621679544261) (Dual a6989586621679544260 ~> Dual b6989586621679544261) -> Type) (a6989586621679837734 :: a6989586621679544260 ~> b6989586621679544261) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (Fmap_6989586621679837736Sym0 :: TyFun (a6989586621679544260 ~> b6989586621679544261) (Dual a6989586621679544260 ~> Dual b6989586621679544261) -> Type) (a6989586621679837734 :: a6989586621679544260 ~> b6989586621679544261) = Fmap_6989586621679837736Sym1 a6989586621679837734
type Apply (Traverse_6989586621680754071Sym0 :: TyFun (a6989586621680747832 ~> f6989586621680747831 b6989586621680747833) (Dual a6989586621680747832 ~> f6989586621680747831 (Dual b6989586621680747833)) -> Type) (a6989586621680754069 :: a6989586621680747832 ~> f6989586621680747831 b6989586621680747833) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type Apply (Traverse_6989586621680754071Sym0 :: TyFun (a6989586621680747832 ~> f6989586621680747831 b6989586621680747833) (Dual a6989586621680747832 ~> f6989586621680747831 (Dual b6989586621680747833)) -> Type) (a6989586621680754069 :: a6989586621680747832 ~> f6989586621680747831 b6989586621680747833) = Traverse_6989586621680754071Sym1 a6989586621680754069
type Apply (Let6989586621680451084Scrutinee_6989586621680450533Sym0 :: TyFun (a ~> (a6989586621680450321 ~> a)) (TyFun k (TyFun (t6989586621680450318 a6989586621680450321) (Dual (Endo a)) -> Type) -> Type) -> Type) (f6989586621680451081 :: a ~> (a6989586621680450321 ~> a)) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Let6989586621680451084Scrutinee_6989586621680450533Sym0 :: TyFun (a ~> (a6989586621680450321 ~> a)) (TyFun k (TyFun (t6989586621680450318 a6989586621680450321) (Dual (Endo a)) -> Type) -> Type) -> Type) (f6989586621680451081 :: a ~> (a6989586621680450321 ~> a)) = (Let6989586621680451084Scrutinee_6989586621680450533Sym1 f6989586621680451081 :: TyFun k (TyFun (t6989586621680450318 a6989586621680450321) (Dual (Endo a)) -> Type) -> Type)

newtype Endo a #

The monoid of endomorphisms under composition.

>>> let computation = Endo ("Hello, " ++) <> Endo (++ "!")
>>> appEndo computation "Haskell"
"Hello, Haskell!"

Constructors

Endo 

Fields

Instances
Generic (Endo a) 
Instance details

Defined in Data.Semigroup.Internal

Associated Types

type Rep (Endo a) :: Type -> Type #

Methods

from :: Endo a -> Rep (Endo a) x #

to :: Rep (Endo a) x -> Endo a #

Semigroup (Endo a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup.Internal

Methods

(<>) :: Endo a -> Endo a -> Endo a #

sconcat :: NonEmpty (Endo a) -> Endo a #

stimes :: Integral b => b -> Endo a -> Endo a #

Monoid (Endo a)

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Methods

mempty :: Endo a #

mappend :: Endo a -> Endo a -> Endo a #

mconcat :: [Endo a] -> Endo a #

Default (Endo a) 
Instance details

Defined in Data.Default.Class

Methods

def :: Endo a #

type Rep (Endo a)

Since: base-4.7.0.0

Instance details

Defined in Data.Semigroup.Internal

type Rep (Endo a) = D1 (MetaData "Endo" "Data.Semigroup.Internal" "base" True) (C1 (MetaCons "Endo" PrefixI True) (S1 (MetaSel (Just "appEndo") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (a -> a))))

newtype All #

Boolean monoid under conjunction (&&).

>>> getAll (All True <> mempty <> All False)
False
>>> getAll (mconcat (map (\x -> All (even x)) [2,4,6,7,8]))
False

Constructors

All 

Fields

Instances
Bounded All

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Methods

minBound :: All #

maxBound :: All #

Eq All

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Methods

(==) :: All -> All -> Bool #

(/=) :: All -> All -> Bool #

Ord All

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Methods

compare :: All -> All -> Ordering #

(<) :: All -> All -> Bool #

(<=) :: All -> All -> Bool #

(>) :: All -> All -> Bool #

(>=) :: All -> All -> Bool #

max :: All -> All -> All #

min :: All -> All -> All #

Read All

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Show All

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Methods

showsPrec :: Int -> All -> ShowS #

show :: All -> String #

showList :: [All] -> ShowS #

Generic All 
Instance details

Defined in Data.Semigroup.Internal

Associated Types

type Rep All :: Type -> Type #

Methods

from :: All -> Rep All x #

to :: Rep All x -> All #

Semigroup All

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup.Internal

Methods

(<>) :: All -> All -> All #

sconcat :: NonEmpty All -> All #

stimes :: Integral b => b -> All -> All #

Monoid All

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Methods

mempty :: All #

mappend :: All -> All -> All #

mconcat :: [All] -> All #

Default All 
Instance details

Defined in Data.Default.Class

Methods

def :: All #

PMonoid All 
Instance details

Defined in Data.Singletons.Prelude.Monoid

Associated Types

type Mempty :: a #

type Mappend arg arg1 :: a #

type Mconcat arg :: a #

SMonoid All 
Instance details

Defined in Data.Singletons.Prelude.Monoid

PSemigroup All 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

Associated Types

type arg <> arg1 :: a #

type Sconcat arg :: a #

SSemigroup All 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

Methods

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

sSconcat :: Sing t -> Sing (Apply SconcatSym0 t) #

SuppressUnusedWarnings AllSym0 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings All_Sym0 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings ShowsPrec_6989586621680865201Sym0 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings GetAllSym0 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings Compare_6989586621679829391Sym0 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings TFHelper_6989586621679837791Sym0 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SingI AllSym0 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

Methods

sing :: Sing AllSym0 #

SuppressUnusedWarnings (Let6989586621680450807Scrutinee_6989586621680450565Sym0 :: TyFun (t6989586621680450318 Bool) All -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (Compare_6989586621679829391Sym1 a6989586621679829389 :: TyFun All Ordering -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (TFHelper_6989586621679837791Sym1 a6989586621679837789 :: TyFun All All -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (ShowsPrec_6989586621680865201Sym1 a6989586621680865198 :: TyFun All (Symbol ~> Symbol) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (Let6989586621680450775Scrutinee_6989586621680450571Sym0 :: TyFun (a6989586621680450321 ~> Bool) (TyFun (t6989586621680450318 a6989586621680450321) All -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (Let6989586621680450775Scrutinee_6989586621680450571Sym1 p6989586621680450773 :: TyFun (t6989586621680450318 a6989586621680450321) All -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Rep All

Since: base-4.7.0.0

Instance details

Defined in Data.Semigroup.Internal

type Rep All = D1 (MetaData "All" "Data.Semigroup.Internal" "base" True) (C1 (MetaCons "All" PrefixI True) (S1 (MetaSel (Just "getAll") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Bool)))
type Mempty 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Mempty = Mempty_6989586621680338341Sym0
type MaxBound 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type MaxBound = MaxBound_6989586621679825276Sym0
type MinBound 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type MinBound = MinBound_6989586621679825274Sym0
data Sing (a :: All) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

data Sing (a :: All) where
type Demote All 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Demote All = All
type Mconcat (arg :: [All]) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Mconcat (arg :: [All]) = Apply (Mconcat_6989586621680328808Sym0 :: TyFun [All] All -> Type) arg
type Show_ (arg :: All) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Show_ (arg :: All) = Apply (Show__6989586621680262307Sym0 :: TyFun All Symbol -> Type) arg
type Sconcat (arg :: NonEmpty All) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Sconcat (arg :: NonEmpty All) = Apply (Sconcat_6989586621679810578Sym0 :: TyFun (NonEmpty All) All -> Type) arg
type Mappend (arg1 :: All) (arg2 :: All) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

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

Defined in Data.Singletons.Prelude.Semigroup

type ShowList (arg1 :: [All]) arg2 = Apply (Apply (ShowList_6989586621680262318Sym0 :: TyFun [All] (Symbol ~> Symbol) -> Type) arg1) arg2
type (a1 :: All) <> (a2 :: All) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type (a1 :: All) <> (a2 :: All) = Apply (Apply TFHelper_6989586621679837791Sym0 a1) a2
type Min (arg1 :: All) (arg2 :: All) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

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

Defined in Data.Singletons.Prelude.Semigroup.Internal

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

Defined in Data.Singletons.Prelude.Semigroup.Internal

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

Defined in Data.Singletons.Prelude.Semigroup.Internal

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

Defined in Data.Singletons.Prelude.Semigroup.Internal

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

Defined in Data.Singletons.Prelude.Semigroup.Internal

type (arg1 :: All) < (arg2 :: All) = Apply (Apply (TFHelper_6989586621679379721Sym0 :: TyFun All (All ~> Bool) -> Type) arg1) arg2
type Compare (a1 :: All) (a2 :: All) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Compare (a1 :: All) (a2 :: All) = Apply (Apply Compare_6989586621679829391Sym0 a1) a2
type (x :: All) /= (y :: All) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type (x :: All) /= (y :: All) = Not (x == y)
type (a :: All) == (b :: All) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type (a :: All) == (b :: All) = Equals_6989586621679827097 a b
type ShowsPrec a1 (a2 :: All) a3 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type ShowsPrec a1 (a2 :: All) a3 = Apply (Apply (Apply ShowsPrec_6989586621680865201Sym0 a1) a2) a3
type Apply GetAllSym0 (a6989586621679819791 :: All) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply GetAllSym0 (a6989586621679819791 :: All) = GetAll a6989586621679819791
type Apply All_Sym0 (a6989586621679852645 :: Bool) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply All_Sym0 (a6989586621679852645 :: Bool) = All_ a6989586621679852645
type Apply AllSym0 (t6989586621679819794 :: Bool) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply AllSym0 (t6989586621679819794 :: Bool) = All t6989586621679819794
type Apply (Compare_6989586621679829391Sym1 a6989586621679829389 :: TyFun All Ordering -> Type) (a6989586621679829390 :: All) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (Compare_6989586621679829391Sym1 a6989586621679829389 :: TyFun All Ordering -> Type) (a6989586621679829390 :: All) = Compare_6989586621679829391 a6989586621679829389 a6989586621679829390
type Apply (TFHelper_6989586621679837791Sym1 a6989586621679837789 :: TyFun All All -> Type) (a6989586621679837790 :: All) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (TFHelper_6989586621679837791Sym1 a6989586621679837789 :: TyFun All All -> Type) (a6989586621679837790 :: All) = TFHelper_6989586621679837791 a6989586621679837789 a6989586621679837790
type Apply (Let6989586621680450807Scrutinee_6989586621680450565Sym0 :: TyFun (t6989586621680450318 Bool) All -> Type) (x6989586621680450806 :: t6989586621680450318 Bool) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Let6989586621680450807Scrutinee_6989586621680450565Sym0 :: TyFun (t6989586621680450318 Bool) All -> Type) (x6989586621680450806 :: t6989586621680450318 Bool) = Let6989586621680450807Scrutinee_6989586621680450565 x6989586621680450806
type Apply (Let6989586621680450775Scrutinee_6989586621680450571Sym1 p6989586621680450773 :: TyFun (t6989586621680450318 a6989586621680450321) All -> Type) (x6989586621680450774 :: t6989586621680450318 a6989586621680450321) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Let6989586621680450775Scrutinee_6989586621680450571Sym1 p6989586621680450773 :: TyFun (t6989586621680450318 a6989586621680450321) All -> Type) (x6989586621680450774 :: t6989586621680450318 a6989586621680450321) = Let6989586621680450775Scrutinee_6989586621680450571 p6989586621680450773 x6989586621680450774
type Apply Compare_6989586621679829391Sym0 (a6989586621679829389 :: All) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply Compare_6989586621679829391Sym0 (a6989586621679829389 :: All) = Compare_6989586621679829391Sym1 a6989586621679829389
type Apply TFHelper_6989586621679837791Sym0 (a6989586621679837789 :: All) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply TFHelper_6989586621679837791Sym0 (a6989586621679837789 :: All) = TFHelper_6989586621679837791Sym1 a6989586621679837789
type Apply ShowsPrec_6989586621680865201Sym0 (a6989586621680865198 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply ShowsPrec_6989586621680865201Sym0 (a6989586621680865198 :: Nat) = ShowsPrec_6989586621680865201Sym1 a6989586621680865198
type Apply (ShowsPrec_6989586621680865201Sym1 a6989586621680865198 :: TyFun All (Symbol ~> Symbol) -> Type) (a6989586621680865199 :: All) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ShowsPrec_6989586621680865201Sym1 a6989586621680865198 :: TyFun All (Symbol ~> Symbol) -> Type) (a6989586621680865199 :: All) = ShowsPrec_6989586621680865201Sym2 a6989586621680865198 a6989586621680865199
type Apply (Let6989586621680450775Scrutinee_6989586621680450571Sym0 :: TyFun (a6989586621680450321 ~> Bool) (TyFun (t6989586621680450318 a6989586621680450321) All -> Type) -> Type) (p6989586621680450773 :: a6989586621680450321 ~> Bool) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Let6989586621680450775Scrutinee_6989586621680450571Sym0 :: TyFun (a6989586621680450321 ~> Bool) (TyFun (t6989586621680450318 a6989586621680450321) All -> Type) -> Type) (p6989586621680450773 :: a6989586621680450321 ~> Bool) = (Let6989586621680450775Scrutinee_6989586621680450571Sym1 p6989586621680450773 :: TyFun (t6989586621680450318 a6989586621680450321) All -> Type)

newtype Any #

Boolean monoid under disjunction (||).

>>> getAny (Any True <> mempty <> Any False)
True
>>> getAny (mconcat (map (\x -> Any (even x)) [2,4,6,7,8]))
True

Constructors

Any 

Fields

Instances
Bounded Any

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Methods

minBound :: Any #

maxBound :: Any #

Eq Any

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Methods

(==) :: Any -> Any -> Bool #

(/=) :: Any -> Any -> Bool #

Ord Any

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Methods

compare :: Any -> Any -> Ordering #

(<) :: Any -> Any -> Bool #

(<=) :: Any -> Any -> Bool #

(>) :: Any -> Any -> Bool #

(>=) :: Any -> Any -> Bool #

max :: Any -> Any -> Any #

min :: Any -> Any -> Any #

Read Any

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Show Any

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Methods

showsPrec :: Int -> Any -> ShowS #

show :: Any -> String #

showList :: [Any] -> ShowS #

Generic Any 
Instance details

Defined in Data.Semigroup.Internal

Associated Types

type Rep Any :: Type -> Type #

Methods

from :: Any -> Rep Any x #

to :: Rep Any x -> Any #

Semigroup Any

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup.Internal

Methods

(<>) :: Any -> Any -> Any #

sconcat :: NonEmpty Any -> Any #

stimes :: Integral b => b -> Any -> Any #

Monoid Any

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Methods

mempty :: Any #

mappend :: Any -> Any -> Any #

mconcat :: [Any] -> Any #

Default Any 
Instance details

Defined in Data.Default.Class

Methods

def :: Any #

PMonoid Any 
Instance details

Defined in Data.Singletons.Prelude.Monoid

Associated Types

type Mempty :: a #

type Mappend arg arg1 :: a #

type Mconcat arg :: a #

SMonoid Any 
Instance details

Defined in Data.Singletons.Prelude.Monoid

PSemigroup Any 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

Associated Types

type arg <> arg1 :: a #

type Sconcat arg :: a #

SSemigroup Any 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

Methods

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

sSconcat :: Sing t -> Sing (Apply SconcatSym0 t) #

SuppressUnusedWarnings AnySym0 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings Any_Sym0 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings ShowsPrec_6989586621680865227Sym0 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings GetAnySym0 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings Compare_6989586621679829409Sym0 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings TFHelper_6989586621679837803Sym0 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SingI AnySym0 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

Methods

sing :: Sing AnySym0 #

SuppressUnusedWarnings (Let6989586621680450798Scrutinee_6989586621680450567Sym0 :: TyFun (t6989586621680450318 Bool) Any -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (Compare_6989586621679829409Sym1 a6989586621679829407 :: TyFun Any Ordering -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (TFHelper_6989586621679837803Sym1 a6989586621679837801 :: TyFun Any Any -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (ShowsPrec_6989586621680865227Sym1 a6989586621680865224 :: TyFun Any (Symbol ~> Symbol) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (Let6989586621680450788Scrutinee_6989586621680450569Sym0 :: TyFun (a6989586621680450321 ~> Bool) (TyFun (t6989586621680450318 a6989586621680450321) Any -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (Let6989586621680450788Scrutinee_6989586621680450569Sym1 p6989586621680450786 :: TyFun (t6989586621680450318 a6989586621680450321) Any -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Rep Any

Since: base-4.7.0.0

Instance details

Defined in Data.Semigroup.Internal

type Rep Any = D1 (MetaData "Any" "Data.Semigroup.Internal" "base" True) (C1 (MetaCons "Any" PrefixI True) (S1 (MetaSel (Just "getAny") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Bool)))
type Mempty 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Mempty = Mempty_6989586621680338343Sym0
type MaxBound 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type MaxBound = MaxBound_6989586621679825280Sym0
type MinBound 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type MinBound = MinBound_6989586621679825278Sym0
data Sing (a :: Any) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

data Sing (a :: Any) where
type Demote Any 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Demote Any = Any
type Mconcat (arg :: [Any]) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Mconcat (arg :: [Any]) = Apply (Mconcat_6989586621680328808Sym0 :: TyFun [Any] Any -> Type) arg
type Show_ (arg :: Any) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Show_ (arg :: Any) = Apply (Show__6989586621680262307Sym0 :: TyFun Any Symbol -> Type) arg
type Sconcat (arg :: NonEmpty Any) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Sconcat (arg :: NonEmpty Any) = Apply (Sconcat_6989586621679810578Sym0 :: TyFun (NonEmpty Any) Any -> Type) arg
type Mappend (arg1 :: Any) (arg2 :: Any) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

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

Defined in Data.Singletons.Prelude.Semigroup

type ShowList (arg1 :: [Any]) arg2 = Apply (Apply (ShowList_6989586621680262318Sym0 :: TyFun [Any] (Symbol ~> Symbol) -> Type) arg1) arg2
type (a1 :: Any) <> (a2 :: Any) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type (a1 :: Any) <> (a2 :: Any) = Apply (Apply TFHelper_6989586621679837803Sym0 a1) a2
type Min (arg1 :: Any) (arg2 :: Any) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

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

Defined in Data.Singletons.Prelude.Semigroup.Internal

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

Defined in Data.Singletons.Prelude.Semigroup.Internal

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

Defined in Data.Singletons.Prelude.Semigroup.Internal

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

Defined in Data.Singletons.Prelude.Semigroup.Internal

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

Defined in Data.Singletons.Prelude.Semigroup.Internal

type (arg1 :: Any) < (arg2 :: Any) = Apply (Apply (TFHelper_6989586621679379721Sym0 :: TyFun Any (Any ~> Bool) -> Type) arg1) arg2
type Compare (a1 :: Any) (a2 :: Any) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Compare (a1 :: Any) (a2 :: Any) = Apply (Apply Compare_6989586621679829409Sym0 a1) a2
type (x :: Any) /= (y :: Any) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type (x :: Any) /= (y :: Any) = Not (x == y)
type (a :: Any) == (b :: Any) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type (a :: Any) == (b :: Any) = Equals_6989586621679827107 a b
type ShowsPrec a1 (a2 :: Any) a3 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type ShowsPrec a1 (a2 :: Any) a3 = Apply (Apply (Apply ShowsPrec_6989586621680865227Sym0 a1) a2) a3
type Apply GetAnySym0 (a6989586621679819805 :: Any) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply GetAnySym0 (a6989586621679819805 :: Any) = GetAny a6989586621679819805
type Apply Any_Sym0 (a6989586621679852644 :: Bool) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply Any_Sym0 (a6989586621679852644 :: Bool) = Any_ a6989586621679852644
type Apply AnySym0 (t6989586621679819808 :: Bool) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply AnySym0 (t6989586621679819808 :: Bool) = Any t6989586621679819808
type Apply (Compare_6989586621679829409Sym1 a6989586621679829407 :: TyFun Any Ordering -> Type) (a6989586621679829408 :: Any) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (Compare_6989586621679829409Sym1 a6989586621679829407 :: TyFun Any Ordering -> Type) (a6989586621679829408 :: Any) = Compare_6989586621679829409 a6989586621679829407 a6989586621679829408
type Apply (TFHelper_6989586621679837803Sym1 a6989586621679837801 :: TyFun Any Any -> Type) (a6989586621679837802 :: Any) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (TFHelper_6989586621679837803Sym1 a6989586621679837801 :: TyFun Any Any -> Type) (a6989586621679837802 :: Any) = TFHelper_6989586621679837803 a6989586621679837801 a6989586621679837802
type Apply (Let6989586621680450798Scrutinee_6989586621680450567Sym0 :: TyFun (t6989586621680450318 Bool) Any -> Type) (x6989586621680450797 :: t6989586621680450318 Bool) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Let6989586621680450798Scrutinee_6989586621680450567Sym0 :: TyFun (t6989586621680450318 Bool) Any -> Type) (x6989586621680450797 :: t6989586621680450318 Bool) = Let6989586621680450798Scrutinee_6989586621680450567 x6989586621680450797
type Apply (Let6989586621680450788Scrutinee_6989586621680450569Sym1 p6989586621680450786 :: TyFun (t6989586621680450318 a6989586621680450321) Any -> Type) (x6989586621680450787 :: t6989586621680450318 a6989586621680450321) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Let6989586621680450788Scrutinee_6989586621680450569Sym1 p6989586621680450786 :: TyFun (t6989586621680450318 a6989586621680450321) Any -> Type) (x6989586621680450787 :: t6989586621680450318 a6989586621680450321) = Let6989586621680450788Scrutinee_6989586621680450569 p6989586621680450786 x6989586621680450787
type Apply Compare_6989586621679829409Sym0 (a6989586621679829407 :: Any) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply Compare_6989586621679829409Sym0 (a6989586621679829407 :: Any) = Compare_6989586621679829409Sym1 a6989586621679829407
type Apply TFHelper_6989586621679837803Sym0 (a6989586621679837801 :: Any) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply TFHelper_6989586621679837803Sym0 (a6989586621679837801 :: Any) = TFHelper_6989586621679837803Sym1 a6989586621679837801
type Apply ShowsPrec_6989586621680865227Sym0 (a6989586621680865224 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply ShowsPrec_6989586621680865227Sym0 (a6989586621680865224 :: Nat) = ShowsPrec_6989586621680865227Sym1 a6989586621680865224
type Apply (ShowsPrec_6989586621680865227Sym1 a6989586621680865224 :: TyFun Any (Symbol ~> Symbol) -> Type) (a6989586621680865225 :: Any) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ShowsPrec_6989586621680865227Sym1 a6989586621680865224 :: TyFun Any (Symbol ~> Symbol) -> Type) (a6989586621680865225 :: Any) = ShowsPrec_6989586621680865227Sym2 a6989586621680865224 a6989586621680865225
type Apply (Let6989586621680450788Scrutinee_6989586621680450569Sym0 :: TyFun (a6989586621680450321 ~> Bool) (TyFun (t6989586621680450318 a6989586621680450321) Any -> Type) -> Type) (p6989586621680450786 :: a6989586621680450321 ~> Bool) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Let6989586621680450788Scrutinee_6989586621680450569Sym0 :: TyFun (a6989586621680450321 ~> Bool) (TyFun (t6989586621680450318 a6989586621680450321) Any -> Type) -> Type) (p6989586621680450786 :: a6989586621680450321 ~> Bool) = (Let6989586621680450788Scrutinee_6989586621680450569Sym1 p6989586621680450786 :: TyFun (t6989586621680450318 a6989586621680450321) Any -> Type)

newtype Sum a #

Monoid under addition.

>>> getSum (Sum 1 <> Sum 2 <> mempty)
3

Constructors

Sum 

Fields

Instances
Monad Sum

Since: base-4.8.0.0

Instance details

Defined in Data.Semigroup.Internal

Methods

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

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

return :: a -> Sum a #

fail :: String -> Sum a #

Functor Sum

Since: base-4.8.0.0

Instance details

Defined in Data.Semigroup.Internal

Methods

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

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

Applicative Sum

Since: base-4.8.0.0

Instance details

Defined in Data.Semigroup.Internal

Methods

pure :: a -> Sum a #

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

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

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

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

Foldable Sum

Since: base-4.8.0.0

Instance details

Defined in Data.Foldable

Methods

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

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

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

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

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

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

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

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

toList :: Sum a -> [a] #

null :: Sum a -> Bool #

length :: Sum a -> Int #

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

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

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

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

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

Traversable Sum

Since: base-4.8.0.0

Instance details

Defined in Data.Traversable

Methods

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

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

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

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

PTraversable Sum 
Instance details

Defined in Data.Singletons.Prelude.Traversable

Associated Types

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

type SequenceA arg :: f (t a) #

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

type Sequence arg :: m (t a) #

STraversable Sum 
Instance details

Defined in Data.Singletons.Prelude.Traversable

Methods

sTraverse :: SApplicative f => Sing t1 -> Sing t2 -> Sing (Apply (Apply TraverseSym0 t1) t2) #

sSequenceA :: SApplicative f => Sing t1 -> Sing (Apply SequenceASym0 t1) #

sMapM :: SMonad m => Sing t1 -> Sing t2 -> Sing (Apply (Apply MapMSym0 t1) t2) #

sSequence :: SMonad m => Sing t1 -> Sing (Apply SequenceSym0 t1) #

PFoldable Sum 
Instance details

Defined in Data.Singletons.Prelude.Foldable

Associated Types

type Fold arg :: m #

type FoldMap arg arg1 :: m #

type Foldr arg arg1 arg2 :: b #

type Foldr' arg arg1 arg2 :: b #

type Foldl arg arg1 arg2 :: b #

type Foldl' arg arg1 arg2 :: b #

type Foldr1 arg arg1 :: a #

type Foldl1 arg arg1 :: a #

type ToList arg :: [a] #

type Null arg :: Bool #

type Length arg :: Nat #

type Elem arg arg1 :: Bool #

type Maximum arg :: a #

type Minimum arg :: a #

type Sum arg :: a #

type Product arg :: a #

SFoldable Sum 
Instance details

Defined in Data.Singletons.Prelude.Foldable

Methods

sFold :: SMonoid m => Sing t1 -> Sing (Apply FoldSym0 t1) #

sFoldMap :: SMonoid m => Sing t1 -> Sing t2 -> Sing (Apply (Apply FoldMapSym0 t1) t2) #

sFoldr :: Sing t1 -> Sing t2 -> Sing t3 -> Sing (Apply (Apply (Apply FoldrSym0 t1) t2) t3) #

sFoldr' :: Sing t1 -> Sing t2 -> Sing t3 -> Sing (Apply (Apply (Apply Foldr'Sym0 t1) t2) t3) #

sFoldl :: Sing t1 -> Sing t2 -> Sing t3 -> Sing (Apply (Apply (Apply FoldlSym0 t1) t2) t3) #

sFoldl' :: Sing t1 -> Sing t2 -> Sing t3 -> Sing (Apply (Apply (Apply Foldl'Sym0 t1) t2) t3) #

sFoldr1 :: Sing t1 -> Sing t2 -> Sing (Apply (Apply Foldr1Sym0 t1) t2) #

sFoldl1 :: Sing t1 -> Sing t2 -> Sing (Apply (Apply Foldl1Sym0 t1) t2) #

sToList :: Sing t1 -> Sing (Apply ToListSym0 t1) #

sNull :: Sing t1 -> Sing (Apply NullSym0 t1) #

sLength :: Sing t1 -> Sing (Apply LengthSym0 t1) #

sElem :: SEq a => Sing t1 -> Sing t2 -> Sing (Apply (Apply ElemSym0 t1) t2) #

sMaximum :: SOrd a => Sing t1 -> Sing (Apply MaximumSym0 t1) #

sMinimum :: SOrd a => Sing t1 -> Sing (Apply MinimumSym0 t1) #

sSum :: SNum a => Sing t1 -> Sing (Apply SumSym0 t1) #

sProduct :: SNum a => Sing t1 -> Sing (Apply ProductSym0 t1) #

Bounded a => Bounded (Sum a)

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Methods

minBound :: Sum a #

maxBound :: Sum a #

Eq a => Eq (Sum a)

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Methods

(==) :: Sum a -> Sum a -> Bool #

(/=) :: Sum a -> Sum a -> Bool #

Num a => Num (Sum a)

Since: base-4.7.0.0

Instance details

Defined in Data.Semigroup.Internal

Methods

(+) :: Sum a -> Sum a -> Sum a #

(-) :: Sum a -> Sum a -> Sum a #

(*) :: Sum a -> Sum a -> Sum a #

negate :: Sum a -> Sum a #

abs :: Sum a -> Sum a #

signum :: Sum a -> Sum a #

fromInteger :: Integer -> Sum a #

Ord a => Ord (Sum a)

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Methods

compare :: Sum a -> Sum a -> Ordering #

(<) :: Sum a -> Sum a -> Bool #

(<=) :: Sum a -> Sum a -> Bool #

(>) :: Sum a -> Sum a -> Bool #

(>=) :: Sum a -> Sum a -> Bool #

max :: Sum a -> Sum a -> Sum a #

min :: Sum a -> Sum a -> Sum a #

Read a => Read (Sum a)

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Show a => Show (Sum a)

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Methods

showsPrec :: Int -> Sum a -> ShowS #

show :: Sum a -> String #

showList :: [Sum a] -> ShowS #

Generic (Sum a) 
Instance details

Defined in Data.Semigroup.Internal

Associated Types

type Rep (Sum a) :: Type -> Type #

Methods

from :: Sum a -> Rep (Sum a) x #

to :: Rep (Sum a) x -> Sum a #

Num a => Semigroup (Sum a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup.Internal

Methods

(<>) :: Sum a -> Sum a -> Sum a #

sconcat :: NonEmpty (Sum a) -> Sum a #

stimes :: Integral b => b -> Sum a -> Sum a #

Num a => Monoid (Sum a)

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Methods

mempty :: Sum a #

mappend :: Sum a -> Sum a -> Sum a #

mconcat :: [Sum a] -> Sum a #

Num a => Default (Sum a) 
Instance details

Defined in Data.Default.Class

Methods

def :: Sum a #

PMonoid (Sum a) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

Associated Types

type Mempty :: a #

type Mappend arg arg1 :: a #

type Mconcat arg :: a #

SNum a => SMonoid (Sum a) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

PSemigroup (Sum a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

Associated Types

type arg <> arg1 :: a #

type Sconcat arg :: a #

SNum a => SSemigroup (Sum a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

Methods

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

sSconcat :: Sing t -> Sing (Apply SconcatSym0 t) #

Generic1 Sum 
Instance details

Defined in Data.Semigroup.Internal

Associated Types

type Rep1 Sum :: k -> Type #

Methods

from1 :: Sum a -> Rep1 Sum a #

to1 :: Rep1 Sum a -> Sum a #

SuppressUnusedWarnings (FromInteger_6989586621679837944Sym0 :: TyFun Nat (Sum a6989586621679837584) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (ShowsPrec_6989586621680865256Sym0 :: TyFun Nat (Sum a6989586621679072580 ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (Sum_Sym0 :: TyFun a6989586621679853028 (Sum a6989586621679853028) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (SumSym0 :: TyFun a6989586621679072580 (Sum a6989586621679072580) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (Pure_6989586621679837813Sym0 :: TyFun a6989586621679544265 (Sum a6989586621679544265) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (TFHelper_6989586621679837915Sym0 :: TyFun (Sum a6989586621679837584) (Sum a6989586621679837584 ~> Sum a6989586621679837584) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (TFHelper_6989586621679837903Sym0 :: TyFun (Sum a6989586621679837584) (Sum a6989586621679837584 ~> Sum a6989586621679837584) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (TFHelper_6989586621679837891Sym0 :: TyFun (Sum a6989586621679837584) (Sum a6989586621679837584 ~> Sum a6989586621679837584) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (TFHelper_6989586621679837879Sym0 :: TyFun (Sum a6989586621679837581) (Sum a6989586621679837581 ~> Sum a6989586621679837581) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (Signum_6989586621679837937Sym0 :: TyFun (Sum a6989586621679837584) (Sum a6989586621679837584) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (Negate_6989586621679837923Sym0 :: TyFun (Sum a6989586621679837584) (Sum a6989586621679837584) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (GetSumSym0 :: TyFun (Sum a6989586621679072580) a6989586621679072580 -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (Compare_6989586621679829430Sym0 :: TyFun (Sum a6989586621679072580) (Sum a6989586621679072580 ~> Ordering) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (Abs_6989586621679837930Sym0 :: TyFun (Sum a6989586621679837584) (Sum a6989586621679837584) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SingI (SumSym0 :: TyFun a (Sum a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

Methods

sing :: Sing SumSym0 #

SuppressUnusedWarnings (Let6989586621680451277Scrutinee_6989586621680450559Sym0 :: TyFun (t6989586621680450318 a6989586621680450321) (Sum a6989586621680450321) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (TFHelper_6989586621679837855Sym0 :: TyFun a6989586621679544262 (Sum b6989586621679544263 ~> Sum a6989586621679544262) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (ShowsPrec_6989586621680865256Sym1 a6989586621680865253 a6989586621679072580 :: TyFun (Sum a6989586621679072580) (Symbol ~> Symbol) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (TFHelper_6989586621679837915Sym1 a6989586621679837913 :: TyFun (Sum a6989586621679837584) (Sum a6989586621679837584) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (TFHelper_6989586621679837903Sym1 a6989586621679837901 :: TyFun (Sum a6989586621679837584) (Sum a6989586621679837584) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (TFHelper_6989586621679837891Sym1 a6989586621679837889 :: TyFun (Sum a6989586621679837584) (Sum a6989586621679837584) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (TFHelper_6989586621679837879Sym1 a6989586621679837877 :: TyFun (Sum a6989586621679837581) (Sum a6989586621679837581) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (TFHelper_6989586621679837867Sym0 :: TyFun (Sum a6989586621679544289) ((a6989586621679544289 ~> Sum b6989586621679544290) ~> Sum b6989586621679544290) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (Compare_6989586621679829430Sym1 a6989586621679829428 :: TyFun (Sum a6989586621679072580) Ordering -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (TFHelper_6989586621679837824Sym0 :: TyFun (Sum (a6989586621679544266 ~> b6989586621679544267)) (Sum a6989586621679544266 ~> Sum b6989586621679544267) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (Fmap_6989586621679837836Sym0 :: TyFun (a6989586621679544260 ~> b6989586621679544261) (Sum a6989586621679544260 ~> Sum b6989586621679544261) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (TFHelper_6989586621679837855Sym1 a6989586621679837853 b6989586621679544263 :: TyFun (Sum b6989586621679544263) (Sum a6989586621679544262) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (TFHelper_6989586621679837824Sym1 a6989586621679837822 :: TyFun (Sum a6989586621679544266) (Sum b6989586621679544267) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (Fmap_6989586621679837836Sym1 a6989586621679837834 :: TyFun (Sum a6989586621679544260) (Sum b6989586621679544261) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (Traverse_6989586621680754083Sym0 :: TyFun (a6989586621680747832 ~> f6989586621680747831 b6989586621680747833) (Sum a6989586621680747832 ~> f6989586621680747831 (Sum b6989586621680747833)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

SuppressUnusedWarnings (TFHelper_6989586621679837867Sym1 a6989586621679837865 b6989586621679544290 :: TyFun (a6989586621679544289 ~> Sum b6989586621679544290) (Sum b6989586621679544290) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (Traverse_6989586621680754083Sym1 a6989586621680754081 :: TyFun (Sum a6989586621680747832) (f6989586621680747831 (Sum b6989586621680747833)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type Product (a :: Sum k2) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

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

Defined in Data.Singletons.Prelude.Foldable

type Sum (a :: Sum k2) = Apply (Sum_6989586621680452008Sym0 :: TyFun (Sum k2) k2 -> Type) a
type Minimum (a :: Sum k2) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Minimum (a :: Sum k2) = Apply (Minimum_6989586621680451988Sym0 :: TyFun (Sum k2) k2 -> Type) a
type Maximum (a :: Sum k2) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Maximum (a :: Sum k2) = Apply (Maximum_6989586621680451981Sym0 :: TyFun (Sum k2) k2 -> Type) a
type Length (a :: Sum a6989586621680450334) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Length (a :: Sum a6989586621680450334) = Apply (Length_6989586621680451974Sym0 :: TyFun (Sum a6989586621680450334) Nat -> Type) a
type Null (a :: Sum a6989586621680450333) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Null (a :: Sum a6989586621680450333) = Apply (Null_6989586621680451994Sym0 :: TyFun (Sum a6989586621680450333) Bool -> Type) a
type ToList (a :: Sum a6989586621680450332) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type ToList (a :: Sum a6989586621680450332) = Apply (ToList_6989586621680452015Sym0 :: TyFun (Sum a6989586621680450332) [a6989586621680450332] -> Type) a
type Fold (arg :: Sum m) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Fold (arg :: Sum m) = Apply (Fold_6989586621680451003Sym0 :: TyFun (Sum m) m -> Type) arg
type Pure (a :: k1) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Pure (a :: k1) = Apply (Pure_6989586621679837813Sym0 :: TyFun k1 (Sum k1) -> Type) a
type Fail arg 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Fail arg = Apply (Fail_6989586621679544807Sym0 :: TyFun Symbol (Sum a) -> Type) arg
type Return (arg :: a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Return (arg :: a) = Apply (Return_6989586621679544800Sym0 :: TyFun a (Sum a) -> Type) arg
type Sequence (arg :: Sum (m a)) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type Sequence (arg :: Sum (m a)) = Apply (Sequence_6989586621680747899Sym0 :: TyFun (Sum (m a)) (m (Sum a)) -> Type) arg
type SequenceA (arg :: Sum (f a)) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type SequenceA (arg :: Sum (f a)) = Apply (SequenceA_6989586621680747874Sym0 :: TyFun (Sum (f a)) (f (Sum a)) -> Type) arg
type Elem (a1 :: k1) (a2 :: Sum k1) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

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

Defined in Data.Singletons.Prelude.Foldable

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

Defined in Data.Singletons.Prelude.Foldable

type Foldr1 (a1 :: k2 ~> (k2 ~> k2)) (a2 :: Sum k2) = Apply (Apply (Foldr1_6989586621680451967Sym0 :: TyFun (k2 ~> (k2 ~> k2)) (Sum k2 ~> k2) -> Type) a1) a2
type FoldMap (a1 :: a6989586621680450321 ~> k2) (a2 :: Sum a6989586621680450321) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type FoldMap (a1 :: a6989586621680450321 ~> k2) (a2 :: Sum a6989586621680450321) = Apply (Apply (FoldMap_6989586621680451859Sym0 :: TyFun (a6989586621680450321 ~> k2) (Sum a6989586621680450321 ~> k2) -> Type) a1) a2
type (a1 :: k1) <$ (a2 :: Sum b6989586621679544263) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type (a1 :: k1) <$ (a2 :: Sum b6989586621679544263) = Apply (Apply (TFHelper_6989586621679837855Sym0 :: TyFun k1 (Sum b6989586621679544263 ~> Sum k1) -> Type) a1) a2
type Fmap (a1 :: a6989586621679544260 ~> b6989586621679544261) (a2 :: Sum a6989586621679544260) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Fmap (a1 :: a6989586621679544260 ~> b6989586621679544261) (a2 :: Sum a6989586621679544260) = Apply (Apply (Fmap_6989586621679837836Sym0 :: TyFun (a6989586621679544260 ~> b6989586621679544261) (Sum a6989586621679544260 ~> Sum b6989586621679544261) -> Type) a1) a2
type (arg1 :: Sum a) <* (arg2 :: Sum b) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

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

Defined in Data.Singletons.Prelude.Semigroup.Internal

type (arg1 :: Sum a) *> (arg2 :: Sum b) = Apply (Apply (TFHelper_6989586621679544740Sym0 :: TyFun (Sum a) (Sum b ~> Sum b) -> Type) arg1) arg2
type (a1 :: Sum (a6989586621679544266 ~> b6989586621679544267)) <*> (a2 :: Sum a6989586621679544266) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type (a1 :: Sum (a6989586621679544266 ~> b6989586621679544267)) <*> (a2 :: Sum a6989586621679544266) = Apply (Apply (TFHelper_6989586621679837824Sym0 :: TyFun (Sum (a6989586621679544266 ~> b6989586621679544267)) (Sum a6989586621679544266 ~> Sum b6989586621679544267) -> Type) a1) a2
type (arg1 :: Sum a) >> (arg2 :: Sum b) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type (arg1 :: Sum a) >> (arg2 :: Sum b) = Apply (Apply (TFHelper_6989586621679544790Sym0 :: TyFun (Sum a) (Sum b ~> Sum b) -> Type) arg1) arg2
type (a1 :: Sum a6989586621679544289) >>= (a2 :: a6989586621679544289 ~> Sum b6989586621679544290) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type (a1 :: Sum a6989586621679544289) >>= (a2 :: a6989586621679544289 ~> Sum b6989586621679544290) = Apply (Apply (TFHelper_6989586621679837867Sym0 :: TyFun (Sum a6989586621679544289) ((a6989586621679544289 ~> Sum b6989586621679544290) ~> Sum b6989586621679544290) -> Type) a1) a2
type MapM (arg1 :: a ~> m b) (arg2 :: Sum a) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type MapM (arg1 :: a ~> m b) (arg2 :: Sum a) = Apply (Apply (MapM_6989586621680747889Sym0 :: TyFun (a ~> m b) (Sum a ~> m (Sum b)) -> Type) arg1) arg2
type Traverse (a1 :: a6989586621680747832 ~> f6989586621680747831 b6989586621680747833) (a2 :: Sum a6989586621680747832) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type Traverse (a1 :: a6989586621680747832 ~> f6989586621680747831 b6989586621680747833) (a2 :: Sum a6989586621680747832) = Apply (Apply (Traverse_6989586621680754083Sym0 :: TyFun (a6989586621680747832 ~> f6989586621680747831 b6989586621680747833) (Sum a6989586621680747832 ~> f6989586621680747831 (Sum b6989586621680747833)) -> Type) a1) a2
type Foldl' (a1 :: k2 ~> (a6989586621680450329 ~> k2)) (a2 :: k2) (a3 :: Sum a6989586621680450329) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Foldl' (a1 :: k2 ~> (a6989586621680450329 ~> k2)) (a2 :: k2) (a3 :: Sum a6989586621680450329) = Apply (Apply (Apply (Foldl'_6989586621680451904Sym0 :: TyFun (k2 ~> (a6989586621680450329 ~> k2)) (k2 ~> (Sum a6989586621680450329 ~> k2)) -> Type) a1) a2) a3
type Foldl (a1 :: k2 ~> (a6989586621680450327 ~> k2)) (a2 :: k2) (a3 :: Sum a6989586621680450327) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Foldl (a1 :: k2 ~> (a6989586621680450327 ~> k2)) (a2 :: k2) (a3 :: Sum a6989586621680450327) = Apply (Apply (Apply (Foldl_6989586621680451887Sym0 :: TyFun (k2 ~> (a6989586621680450327 ~> k2)) (k2 ~> (Sum a6989586621680450327 ~> k2)) -> Type) a1) a2) a3
type Foldr' (a1 :: a6989586621680450324 ~> (k2 ~> k2)) (a2 :: k2) (a3 :: Sum a6989586621680450324) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Foldr' (a1 :: a6989586621680450324 ~> (k2 ~> k2)) (a2 :: k2) (a3 :: Sum a6989586621680450324) = Apply (Apply (Apply (Foldr'_6989586621680451955Sym0 :: TyFun (a6989586621680450324 ~> (k2 ~> k2)) (k2 ~> (Sum a6989586621680450324 ~> k2)) -> Type) a1) a2) a3
type Foldr (a1 :: a6989586621680450322 ~> (k2 ~> k2)) (a2 :: k2) (a3 :: Sum a6989586621680450322) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Foldr (a1 :: a6989586621680450322 ~> (k2 ~> k2)) (a2 :: k2) (a3 :: Sum a6989586621680450322) = Apply (Apply (Apply (Foldr_6989586621680451932Sym0 :: TyFun (a6989586621680450322 ~> (k2 ~> k2)) (k2 ~> (Sum a6989586621680450322 ~> k2)) -> Type) a1) a2) a3
type LiftA2 (arg1 :: a ~> (b ~> c)) (arg2 :: Sum a) (arg3 :: Sum b) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type LiftA2 (arg1 :: a ~> (b ~> c)) (arg2 :: Sum a) (arg3 :: Sum b) = Apply (Apply (Apply (LiftA2_6989586621679544727Sym0 :: TyFun (a ~> (b ~> c)) (Sum a ~> (Sum b ~> Sum c)) -> Type) arg1) arg2) arg3
type Apply (GetSumSym0 :: TyFun (Sum a) a -> Type) (a6989586621679819822 :: Sum a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (GetSumSym0 :: TyFun (Sum a) a -> Type) (a6989586621679819822 :: Sum a) = GetSum a6989586621679819822
type Apply (Compare_6989586621679829430Sym1 a6989586621679829428 :: TyFun (Sum a) Ordering -> Type) (a6989586621679829429 :: Sum a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (Compare_6989586621679829430Sym1 a6989586621679829428 :: TyFun (Sum a) Ordering -> Type) (a6989586621679829429 :: Sum a) = Compare_6989586621679829430 a6989586621679829428 a6989586621679829429
type Rep (Sum a)

Since: base-4.7.0.0

Instance details

Defined in Data.Semigroup.Internal

type Rep (Sum a) = D1 (MetaData "Sum" "Data.Semigroup.Internal" "base" True) (C1 (MetaCons "Sum" PrefixI True) (S1 (MetaSel (Just "getSum") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a)))
type Mempty 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Mempty = (Mempty_6989586621680338345Sym0 :: Sum a)
type MaxBound 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type MaxBound = (MaxBound_6989586621679825287Sym0 :: Sum a)
type MinBound 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type MinBound = (MinBound_6989586621679825285Sym0 :: Sum a)
data Sing (b :: Sum a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

data Sing (b :: Sum a) where
type Demote (Sum a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Demote (Sum a) = Sum (Demote a)
type Rep1 Sum

Since: base-4.7.0.0

Instance details

Defined in Data.Semigroup.Internal

type Rep1 Sum = D1 (MetaData "Sum" "Data.Semigroup.Internal" "base" True) (C1 (MetaCons "Sum" PrefixI True) (S1 (MetaSel (Just "getSum") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1))
type Mconcat (arg :: [Sum a]) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Mconcat (arg :: [Sum a]) = Apply (Mconcat_6989586621680328808Sym0 :: TyFun [Sum a] (Sum a) -> Type) arg
type Show_ (arg :: Sum a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Show_ (arg :: Sum a) = Apply (Show__6989586621680262307Sym0 :: TyFun (Sum a) Symbol -> Type) arg
type Sconcat (arg :: NonEmpty (Sum a)) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Sconcat (arg :: NonEmpty (Sum a)) = Apply (Sconcat_6989586621679810578Sym0 :: TyFun (NonEmpty (Sum a)) (Sum a) -> Type) arg
type FromInteger a2 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type FromInteger a2 = Apply (FromInteger_6989586621679837944Sym0 :: TyFun Nat (Sum a1) -> Type) a2
type Signum (a2 :: Sum a1) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Signum (a2 :: Sum a1) = Apply (Signum_6989586621679837937Sym0 :: TyFun (Sum a1) (Sum a1) -> Type) a2
type Abs (a2 :: Sum a1) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Abs (a2 :: Sum a1) = Apply (Abs_6989586621679837930Sym0 :: TyFun (Sum a1) (Sum a1) -> Type) a2
type Negate (a2 :: Sum a1) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Negate (a2 :: Sum a1) = Apply (Negate_6989586621679837923Sym0 :: TyFun (Sum a1) (Sum a1) -> Type) a2
type Mappend (arg1 :: Sum a) (arg2 :: Sum a) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Mappend (arg1 :: Sum a) (arg2 :: Sum a) = Apply (Apply (Mappend_6989586621680328798Sym0 :: TyFun (Sum a) (Sum a ~> Sum a) -> Type) arg1) arg2
type ShowList (arg1 :: [Sum a]) arg2 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type ShowList (arg1 :: [Sum a]) arg2 = Apply (Apply (ShowList_6989586621680262318Sym0 :: TyFun [Sum a] (Symbol ~> Symbol) -> Type) arg1) arg2
type (a2 :: Sum a1) <> (a3 :: Sum a1) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type (a2 :: Sum a1) <> (a3 :: Sum a1) = Apply (Apply (TFHelper_6989586621679837879Sym0 :: TyFun (Sum a1) (Sum a1 ~> Sum a1) -> Type) a2) a3
type (a2 :: Sum a1) * (a3 :: Sum a1) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type (a2 :: Sum a1) * (a3 :: Sum a1) = Apply (Apply (TFHelper_6989586621679837915Sym0 :: TyFun (Sum a1) (Sum a1 ~> Sum a1) -> Type) a2) a3
type (a2 :: Sum a1) - (a3 :: Sum a1) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type (a2 :: Sum a1) - (a3 :: Sum a1) = Apply (Apply (TFHelper_6989586621679837903Sym0 :: TyFun (Sum a1) (Sum a1 ~> Sum a1) -> Type) a2) a3
type (a2 :: Sum a1) + (a3 :: Sum a1) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type (a2 :: Sum a1) + (a3 :: Sum a1) = Apply (Apply (TFHelper_6989586621679837891Sym0 :: TyFun (Sum a1) (Sum a1 ~> Sum a1) -> Type) a2) a3
type Min (arg1 :: Sum a) (arg2 :: Sum a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Min (arg1 :: Sum a) (arg2 :: Sum a) = Apply (Apply (Min_6989586621679379811Sym0 :: TyFun (Sum a) (Sum a ~> Sum a) -> Type) arg1) arg2
type Max (arg1 :: Sum a) (arg2 :: Sum a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Max (arg1 :: Sum a) (arg2 :: Sum a) = Apply (Apply (Max_6989586621679379793Sym0 :: TyFun (Sum a) (Sum a ~> Sum a) -> Type) arg1) arg2
type (arg1 :: Sum a) >= (arg2 :: Sum a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type (arg1 :: Sum a) >= (arg2 :: Sum a) = Apply (Apply (TFHelper_6989586621679379775Sym0 :: TyFun (Sum a) (Sum a ~> Bool) -> Type) arg1) arg2
type (arg1 :: Sum a) > (arg2 :: Sum a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type (arg1 :: Sum a) > (arg2 :: Sum a) = Apply (Apply (TFHelper_6989586621679379757Sym0 :: TyFun (Sum a) (Sum a ~> Bool) -> Type) arg1) arg2
type (arg1 :: Sum a) <= (arg2 :: Sum a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type (arg1 :: Sum a) <= (arg2 :: Sum a) = Apply (Apply (TFHelper_6989586621679379739Sym0 :: TyFun (Sum a) (Sum a ~> Bool) -> Type) arg1) arg2
type (arg1 :: Sum a) < (arg2 :: Sum a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type (arg1 :: Sum a) < (arg2 :: Sum a) = Apply (Apply (TFHelper_6989586621679379721Sym0 :: TyFun (Sum a) (Sum a ~> Bool) -> Type) arg1) arg2
type Compare (a2 :: Sum a1) (a3 :: Sum a1) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Compare (a2 :: Sum a1) (a3 :: Sum a1) = Apply (Apply (Compare_6989586621679829430Sym0 :: TyFun (Sum a1) (Sum a1 ~> Ordering) -> Type) a2) a3
type (x :: Sum a) /= (y :: Sum a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type (x :: Sum a) /= (y :: Sum a) = Not (x == y)
type (a2 :: Sum a1) == (b :: Sum a1) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type (a2 :: Sum a1) == (b :: Sum a1) = Equals_6989586621679827118 a2 b
type ShowsPrec a2 (a3 :: Sum a1) a4 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type ShowsPrec a2 (a3 :: Sum a1) a4 = Apply (Apply (Apply (ShowsPrec_6989586621680865256Sym0 :: TyFun Nat (Sum a1 ~> (Symbol ~> Symbol)) -> Type) a2) a3) a4
type Apply (SumSym0 :: TyFun a (Sum a) -> Type) (t6989586621679819825 :: a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (SumSym0 :: TyFun a (Sum a) -> Type) (t6989586621679819825 :: a) = Sum t6989586621679819825
type Apply (Pure_6989586621679837813Sym0 :: TyFun a (Sum a) -> Type) (a6989586621679837812 :: a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (Pure_6989586621679837813Sym0 :: TyFun a (Sum a) -> Type) (a6989586621679837812 :: a) = Pure_6989586621679837813 a6989586621679837812
type Apply (FromInteger_6989586621679837944Sym0 :: TyFun Nat (Sum a6989586621679837584) -> Type) (a6989586621679837943 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (FromInteger_6989586621679837944Sym0 :: TyFun Nat (Sum a6989586621679837584) -> Type) (a6989586621679837943 :: Nat) = (FromInteger_6989586621679837944 a6989586621679837943 :: Sum a6989586621679837584)
type Apply (Sum_Sym0 :: TyFun a (Sum a) -> Type) (a6989586621679852643 :: a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (Sum_Sym0 :: TyFun a (Sum a) -> Type) (a6989586621679852643 :: a) = Sum_ a6989586621679852643
type Apply (Negate_6989586621679837923Sym0 :: TyFun (Sum a) (Sum a) -> Type) (a6989586621679837922 :: Sum a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (Negate_6989586621679837923Sym0 :: TyFun (Sum a) (Sum a) -> Type) (a6989586621679837922 :: Sum a) = Negate_6989586621679837923 a6989586621679837922
type Apply (Abs_6989586621679837930Sym0 :: TyFun (Sum a) (Sum a) -> Type) (a6989586621679837929 :: Sum a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (Abs_6989586621679837930Sym0 :: TyFun (Sum a) (Sum a) -> Type) (a6989586621679837929 :: Sum a) = Abs_6989586621679837930 a6989586621679837929
type Apply (Signum_6989586621679837937Sym0 :: TyFun (Sum a) (Sum a) -> Type) (a6989586621679837936 :: Sum a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (Signum_6989586621679837937Sym0 :: TyFun (Sum a) (Sum a) -> Type) (a6989586621679837936 :: Sum a) = Signum_6989586621679837937 a6989586621679837936
type Apply (Let6989586621680451277Scrutinee_6989586621680450559Sym0 :: TyFun (t6989586621680450318 a6989586621680450321) (Sum a6989586621680450321) -> Type) (x6989586621680451276 :: t6989586621680450318 a6989586621680450321) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Let6989586621680451277Scrutinee_6989586621680450559Sym0 :: TyFun (t6989586621680450318 a6989586621680450321) (Sum a6989586621680450321) -> Type) (x6989586621680451276 :: t6989586621680450318 a6989586621680450321) = Let6989586621680451277Scrutinee_6989586621680450559 x6989586621680451276
type Apply (TFHelper_6989586621679837879Sym1 a6989586621679837877 :: TyFun (Sum a) (Sum a) -> Type) (a6989586621679837878 :: Sum a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (TFHelper_6989586621679837879Sym1 a6989586621679837877 :: TyFun (Sum a) (Sum a) -> Type) (a6989586621679837878 :: Sum a) = TFHelper_6989586621679837879 a6989586621679837877 a6989586621679837878
type Apply (TFHelper_6989586621679837891Sym1 a6989586621679837889 :: TyFun (Sum a) (Sum a) -> Type) (a6989586621679837890 :: Sum a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (TFHelper_6989586621679837891Sym1 a6989586621679837889 :: TyFun (Sum a) (Sum a) -> Type) (a6989586621679837890 :: Sum a) = TFHelper_6989586621679837891 a6989586621679837889 a6989586621679837890
type Apply (TFHelper_6989586621679837903Sym1 a6989586621679837901 :: TyFun (Sum a) (Sum a) -> Type) (a6989586621679837902 :: Sum a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (TFHelper_6989586621679837903Sym1 a6989586621679837901 :: TyFun (Sum a) (Sum a) -> Type) (a6989586621679837902 :: Sum a) = TFHelper_6989586621679837903 a6989586621679837901 a6989586621679837902
type Apply (TFHelper_6989586621679837915Sym1 a6989586621679837913 :: TyFun (Sum a) (Sum a) -> Type) (a6989586621679837914 :: Sum a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (TFHelper_6989586621679837915Sym1 a6989586621679837913 :: TyFun (Sum a) (Sum a) -> Type) (a6989586621679837914 :: Sum a) = TFHelper_6989586621679837915 a6989586621679837913 a6989586621679837914
type Apply (TFHelper_6989586621679837824Sym1 a6989586621679837822 :: TyFun (Sum a) (Sum b) -> Type) (a6989586621679837823 :: Sum a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (TFHelper_6989586621679837824Sym1 a6989586621679837822 :: TyFun (Sum a) (Sum b) -> Type) (a6989586621679837823 :: Sum a) = TFHelper_6989586621679837824 a6989586621679837822 a6989586621679837823
type Apply (Fmap_6989586621679837836Sym1 a6989586621679837834 :: TyFun (Sum a) (Sum b) -> Type) (a6989586621679837835 :: Sum a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (Fmap_6989586621679837836Sym1 a6989586621679837834 :: TyFun (Sum a) (Sum b) -> Type) (a6989586621679837835 :: Sum a) = Fmap_6989586621679837836 a6989586621679837834 a6989586621679837835
type Apply (TFHelper_6989586621679837855Sym1 a6989586621679837853 b :: TyFun (Sum b) (Sum a) -> Type) (a6989586621679837854 :: Sum b) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (TFHelper_6989586621679837855Sym1 a6989586621679837853 b :: TyFun (Sum b) (Sum a) -> Type) (a6989586621679837854 :: Sum b) = TFHelper_6989586621679837855 a6989586621679837853 a6989586621679837854
type Apply (Traverse_6989586621680754083Sym1 a6989586621680754081 :: TyFun (Sum a) (f (Sum b)) -> Type) (a6989586621680754082 :: Sum a) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type Apply (Traverse_6989586621680754083Sym1 a6989586621680754081 :: TyFun (Sum a) (f (Sum b)) -> Type) (a6989586621680754082 :: Sum a) = Traverse_6989586621680754083 a6989586621680754081 a6989586621680754082
type Apply (TFHelper_6989586621679837867Sym1 a6989586621679837865 b :: TyFun (a ~> Sum b) (Sum b) -> Type) (a6989586621679837866 :: a ~> Sum b) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (TFHelper_6989586621679837867Sym1 a6989586621679837865 b :: TyFun (a ~> Sum b) (Sum b) -> Type) (a6989586621679837866 :: a ~> Sum b) = TFHelper_6989586621679837867 a6989586621679837865 a6989586621679837866
type Apply (ShowsPrec_6989586621680865256Sym0 :: TyFun Nat (Sum a6989586621679072580 ~> (Symbol ~> Symbol)) -> Type) (a6989586621680865253 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ShowsPrec_6989586621680865256Sym0 :: TyFun Nat (Sum a6989586621679072580 ~> (Symbol ~> Symbol)) -> Type) (a6989586621680865253 :: Nat) = (ShowsPrec_6989586621680865256Sym1 a6989586621680865253 a6989586621679072580 :: TyFun (Sum a6989586621679072580) (Symbol ~> Symbol) -> Type)
type Apply (TFHelper_6989586621679837855Sym0 :: TyFun a6989586621679544262 (Sum b6989586621679544263 ~> Sum a6989586621679544262) -> Type) (a6989586621679837853 :: a6989586621679544262) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (TFHelper_6989586621679837855Sym0 :: TyFun a6989586621679544262 (Sum b6989586621679544263 ~> Sum a6989586621679544262) -> Type) (a6989586621679837853 :: a6989586621679544262) = (TFHelper_6989586621679837855Sym1 a6989586621679837853 b6989586621679544263 :: TyFun (Sum b6989586621679544263) (Sum a6989586621679544262) -> Type)
type Apply (Compare_6989586621679829430Sym0 :: TyFun (Sum a6989586621679072580) (Sum a6989586621679072580 ~> Ordering) -> Type) (a6989586621679829428 :: Sum a6989586621679072580) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (Compare_6989586621679829430Sym0 :: TyFun (Sum a6989586621679072580) (Sum a6989586621679072580 ~> Ordering) -> Type) (a6989586621679829428 :: Sum a6989586621679072580) = Compare_6989586621679829430Sym1 a6989586621679829428
type Apply (TFHelper_6989586621679837879Sym0 :: TyFun (Sum a6989586621679837581) (Sum a6989586621679837581 ~> Sum a6989586621679837581) -> Type) (a6989586621679837877 :: Sum a6989586621679837581) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (TFHelper_6989586621679837879Sym0 :: TyFun (Sum a6989586621679837581) (Sum a6989586621679837581 ~> Sum a6989586621679837581) -> Type) (a6989586621679837877 :: Sum a6989586621679837581) = TFHelper_6989586621679837879Sym1 a6989586621679837877
type Apply (TFHelper_6989586621679837891Sym0 :: TyFun (Sum a6989586621679837584) (Sum a6989586621679837584 ~> Sum a6989586621679837584) -> Type) (a6989586621679837889 :: Sum a6989586621679837584) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (TFHelper_6989586621679837891Sym0 :: TyFun (Sum a6989586621679837584) (Sum a6989586621679837584 ~> Sum a6989586621679837584) -> Type) (a6989586621679837889 :: Sum a6989586621679837584) = TFHelper_6989586621679837891Sym1 a6989586621679837889
type Apply (TFHelper_6989586621679837903Sym0 :: TyFun (Sum a6989586621679837584) (Sum a6989586621679837584 ~> Sum a6989586621679837584) -> Type) (a6989586621679837901 :: Sum a6989586621679837584) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (TFHelper_6989586621679837903Sym0 :: TyFun (Sum a6989586621679837584) (Sum a6989586621679837584 ~> Sum a6989586621679837584) -> Type) (a6989586621679837901 :: Sum a6989586621679837584) = TFHelper_6989586621679837903Sym1 a6989586621679837901
type Apply (TFHelper_6989586621679837915Sym0 :: TyFun (Sum a6989586621679837584) (Sum a6989586621679837584 ~> Sum a6989586621679837584) -> Type) (a6989586621679837913 :: Sum a6989586621679837584) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (TFHelper_6989586621679837915Sym0 :: TyFun (Sum a6989586621679837584) (Sum a6989586621679837584 ~> Sum a6989586621679837584) -> Type) (a6989586621679837913 :: Sum a6989586621679837584) = TFHelper_6989586621679837915Sym1 a6989586621679837913
type Apply (ShowsPrec_6989586621680865256Sym1 a6989586621680865253 a6989586621679072580 :: TyFun (Sum a6989586621679072580) (Symbol ~> Symbol) -> Type) (a6989586621680865254 :: Sum a6989586621679072580) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ShowsPrec_6989586621680865256Sym1 a6989586621680865253 a6989586621679072580 :: TyFun (Sum a6989586621679072580) (Symbol ~> Symbol) -> Type) (a6989586621680865254 :: Sum a6989586621679072580) = ShowsPrec_6989586621680865256Sym2 a6989586621680865253 a6989586621680865254
type Apply (TFHelper_6989586621679837824Sym0 :: TyFun (Sum (a6989586621679544266 ~> b6989586621679544267)) (Sum a6989586621679544266 ~> Sum b6989586621679544267) -> Type) (a6989586621679837822 :: Sum (a6989586621679544266 ~> b6989586621679544267)) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (TFHelper_6989586621679837824Sym0 :: TyFun (Sum (a6989586621679544266 ~> b6989586621679544267)) (Sum a6989586621679544266 ~> Sum b6989586621679544267) -> Type) (a6989586621679837822 :: Sum (a6989586621679544266 ~> b6989586621679544267)) = TFHelper_6989586621679837824Sym1 a6989586621679837822
type Apply (TFHelper_6989586621679837867Sym0 :: TyFun (Sum a6989586621679544289) ((a6989586621679544289 ~> Sum b6989586621679544290) ~> Sum b6989586621679544290) -> Type) (a6989586621679837865 :: Sum a6989586621679544289) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (TFHelper_6989586621679837867Sym0 :: TyFun (Sum a6989586621679544289) ((a6989586621679544289 ~> Sum b6989586621679544290) ~> Sum b6989586621679544290) -> Type) (a6989586621679837865 :: Sum a6989586621679544289) = (TFHelper_6989586621679837867Sym1 a6989586621679837865 b6989586621679544290 :: TyFun (a6989586621679544289 ~> Sum b6989586621679544290) (Sum b6989586621679544290) -> Type)
type Apply (Fmap_6989586621679837836Sym0 :: TyFun (a6989586621679544260 ~> b6989586621679544261) (Sum a6989586621679544260 ~> Sum b6989586621679544261) -> Type) (a6989586621679837834 :: a6989586621679544260 ~> b6989586621679544261) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (Fmap_6989586621679837836Sym0 :: TyFun (a6989586621679544260 ~> b6989586621679544261) (Sum a6989586621679544260 ~> Sum b6989586621679544261) -> Type) (a6989586621679837834 :: a6989586621679544260 ~> b6989586621679544261) = Fmap_6989586621679837836Sym1 a6989586621679837834
type Apply (Traverse_6989586621680754083Sym0 :: TyFun (a6989586621680747832 ~> f6989586621680747831 b6989586621680747833) (Sum a6989586621680747832 ~> f6989586621680747831 (Sum b6989586621680747833)) -> Type) (a6989586621680754081 :: a6989586621680747832 ~> f6989586621680747831 b6989586621680747833) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type Apply (Traverse_6989586621680754083Sym0 :: TyFun (a6989586621680747832 ~> f6989586621680747831 b6989586621680747833) (Sum a6989586621680747832 ~> f6989586621680747831 (Sum b6989586621680747833)) -> Type) (a6989586621680754081 :: a6989586621680747832 ~> f6989586621680747831 b6989586621680747833) = Traverse_6989586621680754083Sym1 a6989586621680754081

newtype Product a #

Monoid under multiplication.

>>> getProduct (Product 3 <> Product 4 <> mempty)
12

Constructors

Product 

Fields

Instances
Monad Product

Since: base-4.8.0.0

Instance details

Defined in Data.Semigroup.Internal

Methods

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

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

return :: a -> Product a #

fail :: String -> Product a #

Functor Product

Since: base-4.8.0.0

Instance details

Defined in Data.Semigroup.Internal

Methods

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

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

Applicative Product

Since: base-4.8.0.0

Instance details

Defined in Data.Semigroup.Internal

Methods

pure :: a -> Product a #

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

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

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

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

Foldable Product

Since: base-4.8.0.0

Instance details

Defined in Data.Foldable

Methods

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

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

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

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

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

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

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

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

toList :: Product a -> [a] #

null :: Product a -> Bool #

length :: Product a -> Int #

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

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

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

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

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

Traversable Product

Since: base-4.8.0.0

Instance details

Defined in Data.Traversable

Methods

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

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

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

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

PTraversable Product 
Instance details

Defined in Data.Singletons.Prelude.Traversable

Associated Types

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

type SequenceA arg :: f (t a) #

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

type Sequence arg :: m (t a) #

STraversable Product 
Instance details

Defined in Data.Singletons.Prelude.Traversable

Methods

sTraverse :: SApplicative f => Sing t1 -> Sing t2 -> Sing (Apply (Apply TraverseSym0 t1) t2) #

sSequenceA :: SApplicative f => Sing t1 -> Sing (Apply SequenceASym0 t1) #

sMapM :: SMonad m => Sing t1 -> Sing t2 -> Sing (Apply (Apply MapMSym0 t1) t2) #

sSequence :: SMonad m => Sing t1 -> Sing (Apply SequenceSym0 t1) #

PFoldable Product 
Instance details

Defined in Data.Singletons.Prelude.Foldable

Associated Types

type Fold arg :: m #

type FoldMap arg arg1 :: m #

type Foldr arg arg1 arg2 :: b #

type Foldr' arg arg1 arg2 :: b #

type Foldl arg arg1 arg2 :: b #

type Foldl' arg arg1 arg2 :: b #

type Foldr1 arg arg1 :: a #

type Foldl1 arg arg1 :: a #

type ToList arg :: [a] #

type Null arg :: Bool #

type Length arg :: Nat #

type Elem arg arg1 :: Bool #

type Maximum arg :: a #

type Minimum arg :: a #

type Sum arg :: a #

type Product arg :: a #

SFoldable Product 
Instance details

Defined in Data.Singletons.Prelude.Foldable

Methods

sFold :: SMonoid m => Sing t1 -> Sing (Apply FoldSym0 t1) #

sFoldMap :: SMonoid m => Sing t1 -> Sing t2 -> Sing (Apply (Apply FoldMapSym0 t1) t2) #

sFoldr :: Sing t1 -> Sing t2 -> Sing t3 -> Sing (Apply (Apply (Apply FoldrSym0 t1) t2) t3) #

sFoldr' :: Sing t1 -> Sing t2 -> Sing t3 -> Sing (Apply (Apply (Apply Foldr'Sym0 t1) t2) t3) #

sFoldl :: Sing t1 -> Sing t2 -> Sing t3 -> Sing (Apply (Apply (Apply FoldlSym0 t1) t2) t3) #

sFoldl' :: Sing t1 -> Sing t2 -> Sing t3 -> Sing (Apply (Apply (Apply Foldl'Sym0 t1) t2) t3) #

sFoldr1 :: Sing t1 -> Sing t2 -> Sing (Apply (Apply Foldr1Sym0 t1) t2) #

sFoldl1 :: Sing t1 -> Sing t2 -> Sing (Apply (Apply Foldl1Sym0 t1) t2) #

sToList :: Sing t1 -> Sing (Apply ToListSym0 t1) #

sNull :: Sing t1 -> Sing (Apply NullSym0 t1) #

sLength :: Sing t1 -> Sing (Apply LengthSym0 t1) #

sElem :: SEq a => Sing t1 -> Sing t2 -> Sing (Apply (Apply ElemSym0 t1) t2) #

sMaximum :: SOrd a => Sing t1 -> Sing (Apply MaximumSym0 t1) #

sMinimum :: SOrd a => Sing t1 -> Sing (Apply MinimumSym0 t1) #

sSum :: SNum a => Sing t1 -> Sing (Apply SumSym0 t1) #

sProduct :: SNum a => Sing t1 -> Sing (Apply ProductSym0 t1) #

Bounded a => Bounded (Product a)

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Eq a => Eq (Product a)

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Methods

(==) :: Product a -> Product a -> Bool #

(/=) :: Product a -> Product a -> Bool #

Num a => Num (Product a)

Since: base-4.7.0.0

Instance details

Defined in Data.Semigroup.Internal

Methods

(+) :: Product a -> Product a -> Product a #

(-) :: Product a -> Product a -> Product a #

(*) :: Product a -> Product a -> Product a #

negate :: Product a -> Product a #

abs :: Product a -> Product a #

signum :: Product a -> Product a #

fromInteger :: Integer -> Product a #

Ord a => Ord (Product a)

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Methods

compare :: Product a -> Product a -> Ordering #

(<) :: Product a -> Product a -> Bool #

(<=) :: Product a -> Product a -> Bool #

(>) :: Product a -> Product a -> Bool #

(>=) :: Product a -> Product a -> Bool #

max :: Product a -> Product a -> Product a #

min :: Product a -> Product a -> Product a #

Read a => Read (Product a)

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Show a => Show (Product a)

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Methods

showsPrec :: Int -> Product a -> ShowS #

show :: Product a -> String #

showList :: [Product a] -> ShowS #

Generic (Product a) 
Instance details

Defined in Data.Semigroup.Internal

Associated Types

type Rep (Product a) :: Type -> Type #

Methods

from :: Product a -> Rep (Product a) x #

to :: Rep (Product a) x -> Product a #

Num a => Semigroup (Product a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup.Internal

Methods

(<>) :: Product a -> Product a -> Product a #

sconcat :: NonEmpty (Product a) -> Product a #

stimes :: Integral b => b -> Product a -> Product a #

Num a => Monoid (Product a)

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Methods

mempty :: Product a #

mappend :: Product a -> Product a -> Product a #

mconcat :: [Product a] -> Product a #

Num a => Default (Product a) 
Instance details

Defined in Data.Default.Class

Methods

def :: Product a #

PMonoid (Product a) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

Associated Types

type Mempty :: a #

type Mappend arg arg1 :: a #

type Mconcat arg :: a #

SNum a => SMonoid (Product a) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

PSemigroup (Product a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

Associated Types

type arg <> arg1 :: a #

type Sconcat arg :: a #

SNum a => SSemigroup (Product a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

Methods

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

sSconcat :: Sing t -> Sing (Apply SconcatSym0 t) #

Generic1 Product 
Instance details

Defined in Data.Semigroup.Internal

Associated Types

type Rep1 Product :: k -> Type #

Methods

from1 :: Product a -> Rep1 Product a #

to1 :: Rep1 Product a -> Product a #

SuppressUnusedWarnings (FromInteger_6989586621679838084Sym0 :: TyFun Nat (Product a6989586621679837602) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (ShowsPrec_6989586621680865285Sym0 :: TyFun Nat (Product a6989586621679072585 ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (Pure_6989586621679837953Sym0 :: TyFun a6989586621679544265 (Product a6989586621679544265) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (Product_Sym0 :: TyFun a6989586621679853036 (Product a6989586621679853036) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (ProductSym0 :: TyFun a6989586621679072585 (Product a6989586621679072585) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (TFHelper_6989586621679838055Sym0 :: TyFun (Product a6989586621679837602) (Product a6989586621679837602 ~> Product a6989586621679837602) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (TFHelper_6989586621679838043Sym0 :: TyFun (Product a6989586621679837602) (Product a6989586621679837602 ~> Product a6989586621679837602) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (TFHelper_6989586621679838031Sym0 :: TyFun (Product a6989586621679837602) (Product a6989586621679837602 ~> Product a6989586621679837602) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (TFHelper_6989586621679838019Sym0 :: TyFun (Product a6989586621679837599) (Product a6989586621679837599 ~> Product a6989586621679837599) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (Signum_6989586621679838077Sym0 :: TyFun (Product a6989586621679837602) (Product a6989586621679837602) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (Negate_6989586621679838063Sym0 :: TyFun (Product a6989586621679837602) (Product a6989586621679837602) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (GetProductSym0 :: TyFun (Product a6989586621679072585) a6989586621679072585 -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (Compare_6989586621679829451Sym0 :: TyFun (Product a6989586621679072585) (Product a6989586621679072585 ~> Ordering) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (Abs_6989586621679838070Sym0 :: TyFun (Product a6989586621679837602) (Product a6989586621679837602) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SingI (ProductSym0 :: TyFun a (Product a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (Let6989586621680451290Scrutinee_6989586621680450562Sym0 :: TyFun (t6989586621680450318 a6989586621680450321) (Product a6989586621680450321) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (TFHelper_6989586621679837995Sym0 :: TyFun a6989586621679544262 (Product b6989586621679544263 ~> Product a6989586621679544262) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (ShowsPrec_6989586621680865285Sym1 a6989586621680865282 a6989586621679072585 :: TyFun (Product a6989586621679072585) (Symbol ~> Symbol) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (TFHelper_6989586621679838055Sym1 a6989586621679838053 :: TyFun (Product a6989586621679837602) (Product a6989586621679837602) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (TFHelper_6989586621679838043Sym1 a6989586621679838041 :: TyFun (Product a6989586621679837602) (Product a6989586621679837602) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (TFHelper_6989586621679838031Sym1 a6989586621679838029 :: TyFun (Product a6989586621679837602) (Product a6989586621679837602) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (TFHelper_6989586621679838019Sym1 a6989586621679838017 :: TyFun (Product a6989586621679837599) (Product a6989586621679837599) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (TFHelper_6989586621679838007Sym0 :: TyFun (Product a6989586621679544289) ((a6989586621679544289 ~> Product b6989586621679544290) ~> Product b6989586621679544290) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (Compare_6989586621679829451Sym1 a6989586621679829449 :: TyFun (Product a6989586621679072585) Ordering -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (TFHelper_6989586621679837964Sym0 :: TyFun (Product (a6989586621679544266 ~> b6989586621679544267)) (Product a6989586621679544266 ~> Product b6989586621679544267) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (Fmap_6989586621679837976Sym0 :: TyFun (a6989586621679544260 ~> b6989586621679544261) (Product a6989586621679544260 ~> Product b6989586621679544261) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (TFHelper_6989586621679837995Sym1 a6989586621679837993 b6989586621679544263 :: TyFun (Product b6989586621679544263) (Product a6989586621679544262) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (TFHelper_6989586621679837964Sym1 a6989586621679837962 :: TyFun (Product a6989586621679544266) (Product b6989586621679544267) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (Fmap_6989586621679837976Sym1 a6989586621679837974 :: TyFun (Product a6989586621679544260) (Product b6989586621679544261) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (Traverse_6989586621680754095Sym0 :: TyFun (a6989586621680747832 ~> f6989586621680747831 b6989586621680747833) (Product a6989586621680747832 ~> f6989586621680747831 (Product b6989586621680747833)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

SuppressUnusedWarnings (TFHelper_6989586621679838007Sym1 a6989586621679838005 b6989586621679544290 :: TyFun (a6989586621679544289 ~> Product b6989586621679544290) (Product b6989586621679544290) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (Traverse_6989586621680754095Sym1 a6989586621680754093 :: TyFun (Product a6989586621680747832) (f6989586621680747831 (Product b6989586621680747833)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type Product (a :: Product k2) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

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

Defined in Data.Singletons.Prelude.Foldable

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

Defined in Data.Singletons.Prelude.Foldable

type Minimum (a :: Product k2) = Apply (Minimum_6989586621680452155Sym0 :: TyFun (Product k2) k2 -> Type) a
type Maximum (a :: Product k2) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Maximum (a :: Product k2) = Apply (Maximum_6989586621680452148Sym0 :: TyFun (Product k2) k2 -> Type) a
type Length (a :: Product a6989586621680450334) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Length (a :: Product a6989586621680450334) = Apply (Length_6989586621680452141Sym0 :: TyFun (Product a6989586621680450334) Nat -> Type) a
type Null (a :: Product a6989586621680450333) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Null (a :: Product a6989586621680450333) = Apply (Null_6989586621680452161Sym0 :: TyFun (Product a6989586621680450333) Bool -> Type) a
type ToList (a :: Product a6989586621680450332) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type ToList (a :: Product a6989586621680450332) = Apply (ToList_6989586621680452182Sym0 :: TyFun (Product a6989586621680450332) [a6989586621680450332] -> Type) a
type Fold (arg :: Product m) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Fold (arg :: Product m) = Apply (Fold_6989586621680451003Sym0 :: TyFun (Product m) m -> Type) arg
type Pure (a :: k1) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Pure (a :: k1) = Apply (Pure_6989586621679837953Sym0 :: TyFun k1 (Product k1) -> Type) a
type Fail arg 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Fail arg = Apply (Fail_6989586621679544807Sym0 :: TyFun Symbol (Product a) -> Type) arg
type Return (arg :: a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Return (arg :: a) = Apply (Return_6989586621679544800Sym0 :: TyFun a (Product a) -> Type) arg
type Sequence (arg :: Product (m a)) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type Sequence (arg :: Product (m a)) = Apply (Sequence_6989586621680747899Sym0 :: TyFun (Product (m a)) (m (Product a)) -> Type) arg
type SequenceA (arg :: Product (f a)) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type SequenceA (arg :: Product (f a)) = Apply (SequenceA_6989586621680747874Sym0 :: TyFun (Product (f a)) (f (Product a)) -> Type) arg
type Elem (a1 :: k1) (a2 :: Product k1) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

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

Defined in Data.Singletons.Prelude.Foldable

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

Defined in Data.Singletons.Prelude.Foldable

type Foldr1 (a1 :: k2 ~> (k2 ~> k2)) (a2 :: Product k2) = Apply (Apply (Foldr1_6989586621680452134Sym0 :: TyFun (k2 ~> (k2 ~> k2)) (Product k2 ~> k2) -> Type) a1) a2
type FoldMap (a1 :: a6989586621680450321 ~> k2) (a2 :: Product a6989586621680450321) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type FoldMap (a1 :: a6989586621680450321 ~> k2) (a2 :: Product a6989586621680450321) = Apply (Apply (FoldMap_6989586621680452026Sym0 :: TyFun (a6989586621680450321 ~> k2) (Product a6989586621680450321 ~> k2) -> Type) a1) a2
type (a1 :: k1) <$ (a2 :: Product b6989586621679544263) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type (a1 :: k1) <$ (a2 :: Product b6989586621679544263) = Apply (Apply (TFHelper_6989586621679837995Sym0 :: TyFun k1 (Product b6989586621679544263 ~> Product k1) -> Type) a1) a2
type Fmap (a1 :: a6989586621679544260 ~> b6989586621679544261) (a2 :: Product a6989586621679544260) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Fmap (a1 :: a6989586621679544260 ~> b6989586621679544261) (a2 :: Product a6989586621679544260) = Apply (Apply (Fmap_6989586621679837976Sym0 :: TyFun (a6989586621679544260 ~> b6989586621679544261) (Product a6989586621679544260 ~> Product b6989586621679544261) -> Type) a1) a2
type (arg1 :: Product a) <* (arg2 :: Product b) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

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

Defined in Data.Singletons.Prelude.Semigroup.Internal

type (arg1 :: Product a) *> (arg2 :: Product b) = Apply (Apply (TFHelper_6989586621679544740Sym0 :: TyFun (Product a) (Product b ~> Product b) -> Type) arg1) arg2
type (a1 :: Product (a6989586621679544266 ~> b6989586621679544267)) <*> (a2 :: Product a6989586621679544266) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type (a1 :: Product (a6989586621679544266 ~> b6989586621679544267)) <*> (a2 :: Product a6989586621679544266) = Apply (Apply (TFHelper_6989586621679837964Sym0 :: TyFun (Product (a6989586621679544266 ~> b6989586621679544267)) (Product a6989586621679544266 ~> Product b6989586621679544267) -> Type) a1) a2
type (arg1 :: Product a) >> (arg2 :: Product b) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type (arg1 :: Product a) >> (arg2 :: Product b) = Apply (Apply (TFHelper_6989586621679544790Sym0 :: TyFun (Product a) (Product b ~> Product b) -> Type) arg1) arg2
type (a1 :: Product a6989586621679544289) >>= (a2 :: a6989586621679544289 ~> Product b6989586621679544290) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type (a1 :: Product a6989586621679544289) >>= (a2 :: a6989586621679544289 ~> Product b6989586621679544290) = Apply (Apply (TFHelper_6989586621679838007Sym0 :: TyFun (Product a6989586621679544289) ((a6989586621679544289 ~> Product b6989586621679544290) ~> Product b6989586621679544290) -> Type) a1) a2
type MapM (arg1 :: a ~> m b) (arg2 :: Product a) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type MapM (arg1 :: a ~> m b) (arg2 :: Product a) = Apply (Apply (MapM_6989586621680747889Sym0 :: TyFun (a ~> m b) (Product a ~> m (Product b)) -> Type) arg1) arg2
type Traverse (a1 :: a6989586621680747832 ~> f6989586621680747831 b6989586621680747833) (a2 :: Product a6989586621680747832) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type Traverse (a1 :: a6989586621680747832 ~> f6989586621680747831 b6989586621680747833) (a2 :: Product a6989586621680747832) = Apply (Apply (Traverse_6989586621680754095Sym0 :: TyFun (a6989586621680747832 ~> f6989586621680747831 b6989586621680747833) (Product a6989586621680747832 ~> f6989586621680747831 (Product b6989586621680747833)) -> Type) a1) a2
type Foldl' (a1 :: k2 ~> (a6989586621680450329 ~> k2)) (a2 :: k2) (a3 :: Product a6989586621680450329) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Foldl' (a1 :: k2 ~> (a6989586621680450329 ~> k2)) (a2 :: k2) (a3 :: Product a6989586621680450329) = Apply (Apply (Apply (Foldl'_6989586621680452071Sym0 :: TyFun (k2 ~> (a6989586621680450329 ~> k2)) (k2 ~> (Product a6989586621680450329 ~> k2)) -> Type) a1) a2) a3
type Foldl (a1 :: k2 ~> (a6989586621680450327 ~> k2)) (a2 :: k2) (a3 :: Product a6989586621680450327) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Foldl (a1 :: k2 ~> (a6989586621680450327 ~> k2)) (a2 :: k2) (a3 :: Product a6989586621680450327) = Apply (Apply (Apply (Foldl_6989586621680452054Sym0 :: TyFun (k2 ~> (a6989586621680450327 ~> k2)) (k2 ~> (Product a6989586621680450327 ~> k2)) -> Type) a1) a2) a3
type Foldr' (a1 :: a6989586621680450324 ~> (k2 ~> k2)) (a2 :: k2) (a3 :: Product a6989586621680450324) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Foldr' (a1 :: a6989586621680450324 ~> (k2 ~> k2)) (a2 :: k2) (a3 :: Product a6989586621680450324) = Apply (Apply (Apply (Foldr'_6989586621680452122Sym0 :: TyFun (a6989586621680450324 ~> (k2 ~> k2)) (k2 ~> (Product a6989586621680450324 ~> k2)) -> Type) a1) a2) a3
type Foldr (a1 :: a6989586621680450322 ~> (k2 ~> k2)) (a2 :: k2) (a3 :: Product a6989586621680450322) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Foldr (a1 :: a6989586621680450322 ~> (k2 ~> k2)) (a2 :: k2) (a3 :: Product a6989586621680450322) = Apply (Apply (Apply (Foldr_6989586621680452099Sym0 :: TyFun (a6989586621680450322 ~> (k2 ~> k2)) (k2 ~> (Product a6989586621680450322 ~> k2)) -> Type) a1) a2) a3
type LiftA2 (arg1 :: a ~> (b ~> c)) (arg2 :: Product a) (arg3 :: Product b) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type LiftA2 (arg1 :: a ~> (b ~> c)) (arg2 :: Product a) (arg3 :: Product b) = Apply (Apply (Apply (LiftA2_6989586621679544727Sym0 :: TyFun (a ~> (b ~> c)) (Product a ~> (Product b ~> Product c)) -> Type) arg1) arg2) arg3
type Apply (GetProductSym0 :: TyFun (Product a) a -> Type) (a6989586621679819839 :: Product a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (GetProductSym0 :: TyFun (Product a) a -> Type) (a6989586621679819839 :: Product a) = GetProduct a6989586621679819839
type Apply (Compare_6989586621679829451Sym1 a6989586621679829449 :: TyFun (Product a) Ordering -> Type) (a6989586621679829450 :: Product a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (Compare_6989586621679829451Sym1 a6989586621679829449 :: TyFun (Product a) Ordering -> Type) (a6989586621679829450 :: Product a) = Compare_6989586621679829451 a6989586621679829449 a6989586621679829450
type Rep (Product a)

Since: base-4.7.0.0

Instance details

Defined in Data.Semigroup.Internal

type Rep (Product a) = D1 (MetaData "Product" "Data.Semigroup.Internal" "base" True) (C1 (MetaCons "Product" PrefixI True) (S1 (MetaSel (Just "getProduct") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a)))
type Mempty 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Mempty = (Mempty_6989586621680338347Sym0 :: Product a)
type MaxBound 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type MaxBound = (MaxBound_6989586621679825294Sym0 :: Product a)
type MinBound 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type MinBound = (MinBound_6989586621679825292Sym0 :: Product a)
data Sing (b :: Product a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

data Sing (b :: Product a) where
type Demote (Product a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Demote (Product a) = Product (Demote a)
type Rep1 Product

Since: base-4.7.0.0

Instance details

Defined in Data.Semigroup.Internal

type Rep1 Product = D1 (MetaData "Product" "Data.Semigroup.Internal" "base" True) (C1 (MetaCons "Product" PrefixI True) (S1 (MetaSel (Just "getProduct") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1))
type Mconcat (arg :: [Product a]) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Mconcat (arg :: [Product a]) = Apply (Mconcat_6989586621680328808Sym0 :: TyFun [Product a] (Product a) -> Type) arg
type Show_ (arg :: Product a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Show_ (arg :: Product a) = Apply (Show__6989586621680262307Sym0 :: TyFun (Product a) Symbol -> Type) arg
type Sconcat (arg :: NonEmpty (Product a)) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Sconcat (arg :: NonEmpty (Product a)) = Apply (Sconcat_6989586621679810578Sym0 :: TyFun (NonEmpty (Product a)) (Product a) -> Type) arg
type FromInteger a2 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type FromInteger a2 = Apply (FromInteger_6989586621679838084Sym0 :: TyFun Nat (Product a1) -> Type) a2
type Signum (a2 :: Product a1) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Signum (a2 :: Product a1) = Apply (Signum_6989586621679838077Sym0 :: TyFun (Product a1) (Product a1) -> Type) a2
type Abs (a2 :: Product a1) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Abs (a2 :: Product a1) = Apply (Abs_6989586621679838070Sym0 :: TyFun (Product a1) (Product a1) -> Type) a2
type Negate (a2 :: Product a1) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Negate (a2 :: Product a1) = Apply (Negate_6989586621679838063Sym0 :: TyFun (Product a1) (Product a1) -> Type) a2
type Mappend (arg1 :: Product a) (arg2 :: Product a) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Mappend (arg1 :: Product a) (arg2 :: Product a) = Apply (Apply (Mappend_6989586621680328798Sym0 :: TyFun (Product a) (Product a ~> Product a) -> Type) arg1) arg2
type ShowList (arg1 :: [Product a]) arg2 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type ShowList (arg1 :: [Product a]) arg2 = Apply (Apply (ShowList_6989586621680262318Sym0 :: TyFun [Product a] (Symbol ~> Symbol) -> Type) arg1) arg2
type (a2 :: Product a1) <> (a3 :: Product a1) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type (a2 :: Product a1) <> (a3 :: Product a1) = Apply (Apply (TFHelper_6989586621679838019Sym0 :: TyFun (Product a1) (Product a1 ~> Product a1) -> Type) a2) a3
type (a2 :: Product a1) * (a3 :: Product a1) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type (a2 :: Product a1) * (a3 :: Product a1) = Apply (Apply (TFHelper_6989586621679838055Sym0 :: TyFun (Product a1) (Product a1 ~> Product a1) -> Type) a2) a3
type (a2 :: Product a1) - (a3 :: Product a1) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type (a2 :: Product a1) - (a3 :: Product a1) = Apply (Apply (TFHelper_6989586621679838043Sym0 :: TyFun (Product a1) (Product a1 ~> Product a1) -> Type) a2) a3
type (a2 :: Product a1) + (a3 :: Product a1) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type (a2 :: Product a1) + (a3 :: Product a1) = Apply (Apply (TFHelper_6989586621679838031Sym0 :: TyFun (Product a1) (Product a1 ~> Product a1) -> Type) a2) a3
type Min (arg1 :: Product a) (arg2 :: Product a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Min (arg1 :: Product a) (arg2 :: Product a) = Apply (Apply (Min_6989586621679379811Sym0 :: TyFun (Product a) (Product a ~> Product a) -> Type) arg1) arg2
type Max (arg1 :: Product a) (arg2 :: Product a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Max (arg1 :: Product a) (arg2 :: Product a) = Apply (Apply (Max_6989586621679379793Sym0 :: TyFun (Product a) (Product a ~> Product a) -> Type) arg1) arg2
type (arg1 :: Product a) >= (arg2 :: Product a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type (arg1 :: Product a) >= (arg2 :: Product a) = Apply (Apply (TFHelper_6989586621679379775Sym0 :: TyFun (Product a) (Product a ~> Bool) -> Type) arg1) arg2
type (arg1 :: Product a) > (arg2 :: Product a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type (arg1 :: Product a) > (arg2 :: Product a) = Apply (Apply (TFHelper_6989586621679379757Sym0 :: TyFun (Product a) (Product a ~> Bool) -> Type) arg1) arg2
type (arg1 :: Product a) <= (arg2 :: Product a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type (arg1 :: Product a) <= (arg2 :: Product a) = Apply (Apply (TFHelper_6989586621679379739Sym0 :: TyFun (Product a) (Product a ~> Bool) -> Type) arg1) arg2
type (arg1 :: Product a) < (arg2 :: Product a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type (arg1 :: Product a) < (arg2 :: Product a) = Apply (Apply (TFHelper_6989586621679379721Sym0 :: TyFun (Product a) (Product a ~> Bool) -> Type) arg1) arg2
type Compare (a2 :: Product a1) (a3 :: Product a1) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Compare (a2 :: Product a1) (a3 :: Product a1) = Apply (Apply (Compare_6989586621679829451Sym0 :: TyFun (Product a1) (Product a1 ~> Ordering) -> Type) a2) a3
type (x :: Product a) /= (y :: Product a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type (x :: Product a) /= (y :: Product a) = Not (x == y)
type (a2 :: Product a1) == (b :: Product a1) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type (a2 :: Product a1) == (b :: Product a1) = Equals_6989586621679827132 a2 b
type ShowsPrec a2 (a3 :: Product a1) a4 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type ShowsPrec a2 (a3 :: Product a1) a4 = Apply (Apply (Apply (ShowsPrec_6989586621680865285Sym0 :: TyFun Nat (Product a1 ~> (Symbol ~> Symbol)) -> Type) a2) a3) a4
type Apply (ProductSym0 :: TyFun a (Product a) -> Type) (t6989586621679819842 :: a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (ProductSym0 :: TyFun a (Product a) -> Type) (t6989586621679819842 :: a) = Product t6989586621679819842
type Apply (Pure_6989586621679837953Sym0 :: TyFun a (Product a) -> Type) (a6989586621679837952 :: a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (Pure_6989586621679837953Sym0 :: TyFun a (Product a) -> Type) (a6989586621679837952 :: a) = Pure_6989586621679837953 a6989586621679837952
type Apply (FromInteger_6989586621679838084Sym0 :: TyFun Nat (Product a6989586621679837602) -> Type) (a6989586621679838083 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (FromInteger_6989586621679838084Sym0 :: TyFun Nat (Product a6989586621679837602) -> Type) (a6989586621679838083 :: Nat) = (FromInteger_6989586621679838084 a6989586621679838083 :: Product a6989586621679837602)
type Apply (Product_Sym0 :: TyFun a (Product a) -> Type) (a6989586621679852642 :: a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (Product_Sym0 :: TyFun a (Product a) -> Type) (a6989586621679852642 :: a) = Product_ a6989586621679852642
type Apply (Negate_6989586621679838063Sym0 :: TyFun (Product a) (Product a) -> Type) (a6989586621679838062 :: Product a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (Negate_6989586621679838063Sym0 :: TyFun (Product a) (Product a) -> Type) (a6989586621679838062 :: Product a) = Negate_6989586621679838063 a6989586621679838062
type Apply (Abs_6989586621679838070Sym0 :: TyFun (Product a) (Product a) -> Type) (a6989586621679838069 :: Product a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (Abs_6989586621679838070Sym0 :: TyFun (Product a) (Product a) -> Type) (a6989586621679838069 :: Product a) = Abs_6989586621679838070 a6989586621679838069
type Apply (Signum_6989586621679838077Sym0 :: TyFun (Product a) (Product a) -> Type) (a6989586621679838076 :: Product a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (Signum_6989586621679838077Sym0 :: TyFun (Product a) (Product a) -> Type) (a6989586621679838076 :: Product a) = Signum_6989586621679838077 a6989586621679838076
type Apply (Let6989586621680451290Scrutinee_6989586621680450562Sym0 :: TyFun (t6989586621680450318 a6989586621680450321) (Product a6989586621680450321) -> Type) (x6989586621680451289 :: t6989586621680450318 a6989586621680450321) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Let6989586621680451290Scrutinee_6989586621680450562Sym0 :: TyFun (t6989586621680450318 a6989586621680450321) (Product a6989586621680450321) -> Type) (x6989586621680451289 :: t6989586621680450318 a6989586621680450321) = Let6989586621680451290Scrutinee_6989586621680450562 x6989586621680451289
type Apply (TFHelper_6989586621679838019Sym1 a6989586621679838017 :: TyFun (Product a) (Product a) -> Type) (a6989586621679838018 :: Product a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (TFHelper_6989586621679838019Sym1 a6989586621679838017 :: TyFun (Product a) (Product a) -> Type) (a6989586621679838018 :: Product a) = TFHelper_6989586621679838019 a6989586621679838017 a6989586621679838018
type Apply (TFHelper_6989586621679838031Sym1 a6989586621679838029 :: TyFun (Product a) (Product a) -> Type) (a6989586621679838030 :: Product a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (TFHelper_6989586621679838031Sym1 a6989586621679838029 :: TyFun (Product a) (Product a) -> Type) (a6989586621679838030 :: Product a) = TFHelper_6989586621679838031 a6989586621679838029 a6989586621679838030
type Apply (TFHelper_6989586621679838043Sym1 a6989586621679838041 :: TyFun (Product a) (Product a) -> Type) (a6989586621679838042 :: Product a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (TFHelper_6989586621679838043Sym1 a6989586621679838041 :: TyFun (Product a) (Product a) -> Type) (a6989586621679838042 :: Product a) = TFHelper_6989586621679838043 a6989586621679838041 a6989586621679838042
type Apply (TFHelper_6989586621679838055Sym1 a6989586621679838053 :: TyFun (Product a) (Product a) -> Type) (a6989586621679838054 :: Product a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (TFHelper_6989586621679838055Sym1 a6989586621679838053 :: TyFun (Product a) (Product a) -> Type) (a6989586621679838054 :: Product a) = TFHelper_6989586621679838055 a6989586621679838053 a6989586621679838054
type Apply (TFHelper_6989586621679837964Sym1 a6989586621679837962 :: TyFun (Product a) (Product b) -> Type) (a6989586621679837963 :: Product a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (TFHelper_6989586621679837964Sym1 a6989586621679837962 :: TyFun (Product a) (Product b) -> Type) (a6989586621679837963 :: Product a) = TFHelper_6989586621679837964 a6989586621679837962 a6989586621679837963
type Apply (Fmap_6989586621679837976Sym1 a6989586621679837974 :: TyFun (Product a) (Product b) -> Type) (a6989586621679837975 :: Product a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (Fmap_6989586621679837976Sym1 a6989586621679837974 :: TyFun (Product a) (Product b) -> Type) (a6989586621679837975 :: Product a) = Fmap_6989586621679837976 a6989586621679837974 a6989586621679837975
type Apply (TFHelper_6989586621679837995Sym1 a6989586621679837993 b :: TyFun (Product b) (Product a) -> Type) (a6989586621679837994 :: Product b) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (TFHelper_6989586621679837995Sym1 a6989586621679837993 b :: TyFun (Product b) (Product a) -> Type) (a6989586621679837994 :: Product b) = TFHelper_6989586621679837995 a6989586621679837993 a6989586621679837994
type Apply (Traverse_6989586621680754095Sym1 a6989586621680754093 :: TyFun (Product a) (f (Product b)) -> Type) (a6989586621680754094 :: Product a) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type Apply (Traverse_6989586621680754095Sym1 a6989586621680754093 :: TyFun (Product a) (f (Product b)) -> Type) (a6989586621680754094 :: Product a) = Traverse_6989586621680754095 a6989586621680754093 a6989586621680754094
type Apply (TFHelper_6989586621679838007Sym1 a6989586621679838005 b :: TyFun (a ~> Product b) (Product b) -> Type) (a6989586621679838006 :: a ~> Product b) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (TFHelper_6989586621679838007Sym1 a6989586621679838005 b :: TyFun (a ~> Product b) (Product b) -> Type) (a6989586621679838006 :: a ~> Product b) = TFHelper_6989586621679838007 a6989586621679838005 a6989586621679838006
type Apply (ShowsPrec_6989586621680865285Sym0 :: TyFun Nat (Product a6989586621679072585 ~> (Symbol ~> Symbol)) -> Type) (a6989586621680865282 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ShowsPrec_6989586621680865285Sym0 :: TyFun Nat (Product a6989586621679072585 ~> (Symbol ~> Symbol)) -> Type) (a6989586621680865282 :: Nat) = (ShowsPrec_6989586621680865285Sym1 a6989586621680865282 a6989586621679072585 :: TyFun (Product a6989586621679072585) (Symbol ~> Symbol) -> Type)
type Apply (TFHelper_6989586621679837995Sym0 :: TyFun a6989586621679544262 (Product b6989586621679544263 ~> Product a6989586621679544262) -> Type) (a6989586621679837993 :: a6989586621679544262) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (TFHelper_6989586621679837995Sym0 :: TyFun a6989586621679544262 (Product b6989586621679544263 ~> Product a6989586621679544262) -> Type) (a6989586621679837993 :: a6989586621679544262) = (TFHelper_6989586621679837995Sym1 a6989586621679837993 b6989586621679544263 :: TyFun (Product b6989586621679544263) (Product a6989586621679544262) -> Type)
type Apply (Compare_6989586621679829451Sym0 :: TyFun (Product a6989586621679072585) (Product a6989586621679072585 ~> Ordering) -> Type) (a6989586621679829449 :: Product a6989586621679072585) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (Compare_6989586621679829451Sym0 :: TyFun (Product a6989586621679072585) (Product a6989586621679072585 ~> Ordering) -> Type) (a6989586621679829449 :: Product a6989586621679072585) = Compare_6989586621679829451Sym1 a6989586621679829449
type Apply (TFHelper_6989586621679838019Sym0 :: TyFun (Product a6989586621679837599) (Product a6989586621679837599 ~> Product a6989586621679837599) -> Type) (a6989586621679838017 :: Product a6989586621679837599) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (TFHelper_6989586621679838019Sym0 :: TyFun (Product a6989586621679837599) (Product a6989586621679837599 ~> Product a6989586621679837599) -> Type) (a6989586621679838017 :: Product a6989586621679837599) = TFHelper_6989586621679838019Sym1 a6989586621679838017
type Apply (TFHelper_6989586621679838031Sym0 :: TyFun (Product a6989586621679837602) (Product a6989586621679837602 ~> Product a6989586621679837602) -> Type) (a6989586621679838029 :: Product a6989586621679837602) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (TFHelper_6989586621679838031Sym0 :: TyFun (Product a6989586621679837602) (Product a6989586621679837602 ~> Product a6989586621679837602) -> Type) (a6989586621679838029 :: Product a6989586621679837602) = TFHelper_6989586621679838031Sym1 a6989586621679838029
type Apply (TFHelper_6989586621679838043Sym0 :: TyFun (Product a6989586621679837602) (Product a6989586621679837602 ~> Product a6989586621679837602) -> Type) (a6989586621679838041 :: Product a6989586621679837602) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (TFHelper_6989586621679838043Sym0 :: TyFun (Product a6989586621679837602) (Product a6989586621679837602 ~> Product a6989586621679837602) -> Type) (a6989586621679838041 :: Product a6989586621679837602) = TFHelper_6989586621679838043Sym1 a6989586621679838041
type Apply (TFHelper_6989586621679838055Sym0 :: TyFun (Product a6989586621679837602) (Product a6989586621679837602 ~> Product a6989586621679837602) -> Type) (a6989586621679838053 :: Product a6989586621679837602) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (TFHelper_6989586621679838055Sym0 :: TyFun (Product a6989586621679837602) (Product a6989586621679837602 ~> Product a6989586621679837602) -> Type) (a6989586621679838053 :: Product a6989586621679837602) = TFHelper_6989586621679838055Sym1 a6989586621679838053
type Apply (ShowsPrec_6989586621680865285Sym1 a6989586621680865282 a6989586621679072585 :: TyFun (Product a6989586621679072585) (Symbol ~> Symbol) -> Type) (a6989586621680865283 :: Product a6989586621679072585) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ShowsPrec_6989586621680865285Sym1 a6989586621680865282 a6989586621679072585 :: TyFun (Product a6989586621679072585) (Symbol ~> Symbol) -> Type) (a6989586621680865283 :: Product a6989586621679072585) = ShowsPrec_6989586621680865285Sym2 a6989586621680865282 a6989586621680865283
type Apply (TFHelper_6989586621679837964Sym0 :: TyFun (Product (a6989586621679544266 ~> b6989586621679544267)) (Product a6989586621679544266 ~> Product b6989586621679544267) -> Type) (a6989586621679837962 :: Product (a6989586621679544266 ~> b6989586621679544267)) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (TFHelper_6989586621679837964Sym0 :: TyFun (Product (a6989586621679544266 ~> b6989586621679544267)) (Product a6989586621679544266 ~> Product b6989586621679544267) -> Type) (a6989586621679837962 :: Product (a6989586621679544266 ~> b6989586621679544267)) = TFHelper_6989586621679837964Sym1 a6989586621679837962
type Apply (TFHelper_6989586621679838007Sym0 :: TyFun (Product a6989586621679544289) ((a6989586621679544289 ~> Product b6989586621679544290) ~> Product b6989586621679544290) -> Type) (a6989586621679838005 :: Product a6989586621679544289) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (TFHelper_6989586621679838007Sym0 :: TyFun (Product a6989586621679544289) ((a6989586621679544289 ~> Product b6989586621679544290) ~> Product b6989586621679544290) -> Type) (a6989586621679838005 :: Product a6989586621679544289) = (TFHelper_6989586621679838007Sym1 a6989586621679838005 b6989586621679544290 :: TyFun (a6989586621679544289 ~> Product b6989586621679544290) (Product b6989586621679544290) -> Type)
type Apply (Fmap_6989586621679837976Sym0 :: TyFun (a6989586621679544260 ~> b6989586621679544261) (Product a6989586621679544260 ~> Product b6989586621679544261) -> Type) (a6989586621679837974 :: a6989586621679544260 ~> b6989586621679544261) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (Fmap_6989586621679837976Sym0 :: TyFun (a6989586621679544260 ~> b6989586621679544261) (Product a6989586621679544260 ~> Product b6989586621679544261) -> Type) (a6989586621679837974 :: a6989586621679544260 ~> b6989586621679544261) = Fmap_6989586621679837976Sym1 a6989586621679837974
type Apply (Traverse_6989586621680754095Sym0 :: TyFun (a6989586621680747832 ~> f6989586621680747831 b6989586621680747833) (Product a6989586621680747832 ~> f6989586621680747831 (Product b6989586621680747833)) -> Type) (a6989586621680754093 :: a6989586621680747832 ~> f6989586621680747831 b6989586621680747833) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type Apply (Traverse_6989586621680754095Sym0 :: TyFun (a6989586621680747832 ~> f6989586621680747831 b6989586621680747833) (Product a6989586621680747832 ~> f6989586621680747831 (Product b6989586621680747833)) -> Type) (a6989586621680754093 :: a6989586621680747832 ~> f6989586621680747831 b6989586621680747833) = Traverse_6989586621680754095Sym1 a6989586621680754093

newtype Alt (f :: k -> Type) (a :: k) :: forall k. (k -> Type) -> k -> Type #

Monoid under <|>.

Since: base-4.8.0.0

Constructors

Alt 

Fields

Instances
Generic1 (Alt f :: k -> Type) 
Instance details

Defined in Data.Semigroup.Internal

Associated Types

type Rep1 (Alt f) :: k -> Type #

Methods

from1 :: Alt f a -> Rep1 (Alt f) a #

to1 :: Rep1 (Alt f) a -> Alt f a #

Monad f => Monad (Alt f)

Since: base-4.8.0.0

Instance details

Defined in Data.Semigroup.Internal

Methods

(>>=) :: Alt f a -> (a -> Alt f b) -> Alt f b #

(>>) :: Alt f a -> Alt f b -> Alt f b #

return :: a -> Alt f a #

fail :: String -> Alt f a #

Functor f => Functor (Alt f)

Since: base-4.8.0.0

Instance details

Defined in Data.Semigroup.Internal

Methods

fmap :: (a -> b) -> Alt f a -> Alt f b #

(<$) :: a -> Alt f b -> Alt f a #

Applicative f => Applicative (Alt f)

Since: base-4.8.0.0

Instance details

Defined in Data.Semigroup.Internal

Methods

pure :: a -> Alt f a #

(<*>) :: Alt f (a -> b) -> Alt f a -> Alt f b #

liftA2 :: (a -> b -> c) -> Alt f a -> Alt f b -> Alt f c #

(*>) :: Alt f a -> Alt f b -> Alt f b #

(<*) :: Alt f a -> Alt f b -> Alt f a #

Foldable f => Foldable (Alt f)

Since: base-4.12.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => Alt f m -> m #

foldMap :: Monoid m => (a -> m) -> Alt f a -> m #

foldr :: (a -> b -> b) -> b -> Alt f a -> b #

foldr' :: (a -> b -> b) -> b -> Alt f a -> b #

foldl :: (b -> a -> b) -> b -> Alt f a -> b #

foldl' :: (b -> a -> b) -> b -> Alt f a -> b #

foldr1 :: (a -> a -> a) -> Alt f a -> a #

foldl1 :: (a -> a -> a) -> Alt f a -> a #

toList :: Alt f a -> [a] #

null :: Alt f a -> Bool #

length :: Alt f a -> Int #

elem :: Eq a => a -> Alt f a -> Bool #

maximum :: Ord a => Alt f a -> a #

minimum :: Ord a => Alt f a -> a #

sum :: Num a => Alt f a -> a #

product :: Num a => Alt f a -> a #

Traversable f => Traversable (Alt f)

Since: base-4.12.0.0

Instance details

Defined in Data.Traversable

Methods

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

sequenceA :: Applicative f0 => Alt f (f0 a) -> f0 (Alt f a) #

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

sequence :: Monad m => Alt f (m a) -> m (Alt f a) #

Alternative f => Alternative (Alt f)

Since: base-4.8.0.0

Instance details

Defined in Data.Semigroup.Internal

Methods

empty :: Alt f a #

(<|>) :: Alt f a -> Alt f a -> Alt f a #

some :: Alt f a -> Alt f [a] #

many :: Alt f a -> Alt f [a] #

MonadPlus f => MonadPlus (Alt f)

Since: base-4.8.0.0

Instance details

Defined in Data.Semigroup.Internal

Methods

mzero :: Alt f a #

mplus :: Alt f a -> Alt f a -> Alt f a #

Enum (f a) => Enum (Alt f a)

Since: base-4.8.0.0

Instance details

Defined in Data.Semigroup.Internal

Methods

succ :: Alt f a -> Alt f a #

pred :: Alt f a -> Alt f a #

toEnum :: Int -> Alt f a #

fromEnum :: Alt f a -> Int #

enumFrom :: Alt f a -> [Alt f a] #

enumFromThen :: Alt f a -> Alt f a -> [Alt f a] #

enumFromTo :: Alt f a -> Alt f a -> [Alt f a] #

enumFromThenTo :: Alt f a -> Alt f a -> Alt f a -> [Alt f a] #

Eq (f a) => Eq (Alt f a)

Since: base-4.8.0.0

Instance details

Defined in Data.Semigroup.Internal

Methods

(==) :: Alt f a -> Alt f a -> Bool #

(/=) :: Alt f a -> Alt f a -> Bool #

Num (f a) => Num (Alt f a)

Since: base-4.8.0.0

Instance details

Defined in Data.Semigroup.Internal

Methods

(+) :: Alt f a -> Alt f a -> Alt f a #

(-) :: Alt f a -> Alt f a -> Alt f a #

(*) :: Alt f a -> Alt f a -> Alt f a #

negate :: Alt f a -> Alt f a #

abs :: Alt f a -> Alt f a #

signum :: Alt f a -> Alt f a #

fromInteger :: Integer -> Alt f a #

Ord (f a) => Ord (Alt f a)

Since: base-4.8.0.0

Instance details

Defined in Data.Semigroup.Internal

Methods

compare :: Alt f a -> Alt f a -> Ordering #

(<) :: Alt f a -> Alt f a -> Bool #

(<=) :: Alt f a -> Alt f a -> Bool #

(>) :: Alt f a -> Alt f a -> Bool #

(>=) :: Alt f a -> Alt f a -> Bool #

max :: Alt f a -> Alt f a -> Alt f a #

min :: Alt f a -> Alt f a -> Alt f a #

Read (f a) => Read (Alt f a)

Since: base-4.8.0.0

Instance details

Defined in Data.Semigroup.Internal

Methods

readsPrec :: Int -> ReadS (Alt f a) #

readList :: ReadS [Alt f a] #

readPrec :: ReadPrec (Alt f a) #

readListPrec :: ReadPrec [Alt f a] #

Show (f a) => Show (Alt f a)

Since: base-4.8.0.0

Instance details

Defined in Data.Semigroup.Internal

Methods

showsPrec :: Int -> Alt f a -> ShowS #

show :: Alt f a -> String #

showList :: [Alt f a] -> ShowS #

Generic (Alt f a) 
Instance details

Defined in Data.Semigroup.Internal

Associated Types

type Rep (Alt f a) :: Type -> Type #

Methods

from :: Alt f a -> Rep (Alt f a) x #

to :: Rep (Alt f a) x -> Alt f a #

Alternative f => Semigroup (Alt f a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup.Internal

Methods

(<>) :: Alt f a -> Alt f a -> Alt f a #

sconcat :: NonEmpty (Alt f a) -> Alt f a #

stimes :: Integral b => b -> Alt f a -> Alt f a #

Alternative f => Monoid (Alt f a)

Since: base-4.8.0.0

Instance details

Defined in Data.Semigroup.Internal

Methods

mempty :: Alt f a #

mappend :: Alt f a -> Alt f a -> Alt f a #

mconcat :: [Alt f a] -> Alt f a #

type Rep1 (Alt f :: k -> Type)

Since: base-4.8.0.0

Instance details

Defined in Data.Semigroup.Internal

type Rep1 (Alt f :: k -> Type) = D1 (MetaData "Alt" "Data.Semigroup.Internal" "base" True) (C1 (MetaCons "Alt" PrefixI True) (S1 (MetaSel (Just "getAlt") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec1 f)))
type Rep (Alt f a)

Since: base-4.8.0.0

Instance details

Defined in Data.Semigroup.Internal

type Rep (Alt f a) = D1 (MetaData "Alt" "Data.Semigroup.Internal" "base" True) (C1 (MetaCons "Alt" PrefixI True) (S1 (MetaSel (Just "getAlt") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (f a))))

sameSymbol :: (KnownSymbol a, KnownSymbol b) => Proxy a -> Proxy b -> Maybe (a :~: b) #

We either get evidence that this function was instantiated with the same type-level symbols, or Nothing.

Since: base-4.7.0.0

someSymbolVal :: String -> SomeSymbol #

Convert a string into an unknown type-level symbol.

Since: base-4.7.0.0

someNatVal :: Integer -> Maybe SomeNat #

Convert an integer into an unknown type-level natural.

Since: base-4.7.0.0

symbolVal' :: KnownSymbol n => Proxy# n -> String #

Since: base-4.8.0.0

natVal' :: KnownNat n => Proxy# n -> Integer #

Since: base-4.8.0.0

symbolVal :: KnownSymbol n => proxy n -> String #

Since: base-4.7.0.0

natVal :: KnownNat n => proxy n -> Integer #

Since: base-4.7.0.0

data SomeSymbol where #

This type represents unknown type-level symbols.

Constructors

SomeSymbol :: forall (n :: Symbol). KnownSymbol n => Proxy n -> SomeSymbol

Since: base-4.7.0.0

Instances
Eq SomeSymbol

Since: base-4.7.0.0

Instance details

Defined in GHC.TypeLits

Ord SomeSymbol

Since: base-4.7.0.0

Instance details

Defined in GHC.TypeLits

Read SomeSymbol

Since: base-4.7.0.0

Instance details

Defined in GHC.TypeLits

Show SomeSymbol

Since: base-4.7.0.0

Instance details

Defined in GHC.TypeLits

data ErrorMessage where #

A description of a custom type error.

Constructors

Text :: forall. Symbol -> ErrorMessage

Show the text as is.

ShowType :: forall t. t -> ErrorMessage

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

(:<>:) :: forall. ErrorMessage -> ErrorMessage -> ErrorMessage infixl 6

Put two pieces of error message next to each other.

(:$$:) :: forall. ErrorMessage -> ErrorMessage -> ErrorMessage infixl 5

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

Instances
type Check (a1 @&& a2 :: TyFun (Maybe ErrorMessage) (Maybe ErrorMessage) -> Type) (x :: Maybe ErrorMessage) Source # 
Instance details

Defined in Data.Type.BitRecords.Assert

type Check (a1 @&& a2 :: TyFun (Maybe ErrorMessage) (Maybe ErrorMessage) -> Type) (x :: Maybe ErrorMessage)

sameNat :: (KnownNat a, KnownNat b) => Proxy a -> Proxy b -> Maybe (a :~: b) #

We either get evidence that this function was instantiated with the same type-level numbers, or Nothing.

Since: base-4.7.0.0

data SomeNat where #

This type represents unknown type-level natural numbers.

Since: base-4.10.0.0

Constructors

SomeNat :: forall (n :: Nat). KnownNat n => Proxy n -> SomeNat 
Instances
Eq SomeNat

Since: base-4.7.0.0

Instance details

Defined in GHC.TypeNats

Methods

(==) :: SomeNat -> SomeNat -> Bool #

(/=) :: SomeNat -> SomeNat -> Bool #

Ord SomeNat

Since: base-4.7.0.0

Instance details

Defined in GHC.TypeNats

Read SomeNat

Since: base-4.7.0.0

Instance details

Defined in GHC.TypeNats

Show SomeNat

Since: base-4.7.0.0

Instance details

Defined in GHC.TypeNats

type (<=) (x :: Nat) (y :: Nat) = (x <=? y) ~ True infix 4 #

Comparison of type-level naturals, as a constraint.

Since: base-4.7.0.0

unwords :: [String] -> String #

unwords is an inverse operation to words. It joins words with separating spaces.

>>> unwords ["Lorem", "ipsum", "dolor"]
"Lorem ipsum dolor"

words :: String -> [String] #

words breaks a string up into a list of words, which were delimited by white space.

>>> words "Lorem ipsum\ndolor"
["Lorem","ipsum","dolor"]

unlines :: [String] -> String #

unlines is an inverse operation to lines. It joins lines, after appending a terminating newline to each.

>>> unlines ["Hello", "World", "!"]
"Hello\nWorld\n!\n"

lines :: String -> [String] #

lines breaks a string up into a list of strings at newline characters. The resulting strings do not contain newlines.

Note that after splitting the string at newline characters, the last part of the string is considered a line even if it doesn't end with a newline. For example,

>>> lines ""
[]
>>> lines "\n"
[""]
>>> lines "one"
["one"]
>>> lines "one\n"
["one"]
>>> lines "one\n\n"
["one",""]
>>> lines "one\ntwo"
["one","two"]
>>> lines "one\ntwo\n"
["one","two"]

Thus lines s contains at least as many elements as newlines in s.

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

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

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

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

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

data Proxy (t :: k) :: forall k. k -> Type #

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

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

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

Proxy can even hold types of higher kinds,

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

Constructors

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

Defined in GHC.Generics

Associated Types

type Rep1 Proxy :: k -> Type #

Methods

from1 :: Proxy a -> Rep1 Proxy a #

to1 :: Rep1 Proxy a -> Proxy a #

Monad (Proxy :: Type -> Type)

Since: base-4.7.0.0

Instance details

Defined in Data.Proxy

Methods

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

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

return :: a -> Proxy a #

fail :: String -> Proxy a #

Functor (Proxy :: Type -> Type)

Since: base-4.7.0.0

Instance details

Defined in Data.Proxy

Methods

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

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

Applicative (Proxy :: Type -> Type)

Since: base-4.7.0.0

Instance details

Defined in Data.Proxy

Methods

pure :: a -> Proxy a #

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

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

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

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

Foldable (Proxy :: Type -> Type)

Since: base-4.7.0.0

Instance details

Defined in Data.Foldable

Methods

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

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

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

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

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

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

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

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

toList :: Proxy a -> [a] #

null :: Proxy a -> Bool #

length :: Proxy a -> Int #

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

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

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

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

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

Traversable (Proxy :: Type -> Type)

Since: base-4.7.0.0

Instance details

Defined in Data.Traversable

Methods

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

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

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

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

Eq1 (Proxy :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

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

Ord1 (Proxy :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

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

Read1 (Proxy :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

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

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

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

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

Show1 (Proxy :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

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

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

Alternative (Proxy :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Proxy

Methods

empty :: Proxy a #

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

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

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

MonadPlus (Proxy :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Proxy

Methods

mzero :: Proxy a #

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

Bounded (Proxy t)

Since: base-4.7.0.0

Instance details

Defined in Data.Proxy

Methods

minBound :: Proxy t #

maxBound :: Proxy t #

Enum (Proxy s)

Since: base-4.7.0.0

Instance details

Defined in Data.Proxy

Methods

succ :: Proxy s -> Proxy s #

pred :: Proxy s -> Proxy s #

toEnum :: Int -> Proxy s #

fromEnum :: Proxy s -> Int #

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

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

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

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

Eq (Proxy s)

Since: base-4.7.0.0

Instance details

Defined in Data.Proxy

Methods

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

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

Ord (Proxy s)

Since: base-4.7.0.0

Instance details

Defined in Data.Proxy

Methods

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

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

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

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

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

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

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

Read (Proxy t)

Since: base-4.7.0.0

Instance details

Defined in Data.Proxy

Show (Proxy s)

Since: base-4.7.0.0

Instance details

Defined in Data.Proxy

Methods

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

show :: Proxy s -> String #

showList :: [Proxy s] -> ShowS #

Ix (Proxy s)

Since: base-4.7.0.0

Instance details

Defined in Data.Proxy

Methods

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

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

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

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

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

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

Generic (Proxy t) 
Instance details

Defined in GHC.Generics

Associated Types

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

Methods

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

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

Semigroup (Proxy s)

Since: base-4.9.0.0

Instance details

Defined in Data.Proxy

Methods

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

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

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

Monoid (Proxy s)

Since: base-4.7.0.0

Instance details

Defined in Data.Proxy

Methods

mempty :: Proxy s #

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

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

BitStringBuilderHoley (Proxy (MkField MkFieldFlag)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

Associated Types

type ToBitStringBuilder (Proxy (MkField MkFieldFlag)) a :: Type Source #

BitStringBuilderHoley (Proxy (MkField MkFieldI8)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

Associated Types

type ToBitStringBuilder (Proxy (MkField MkFieldI8)) a :: Type Source #

BitStringBuilderHoley (Proxy (MkField MkFieldI16)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

Associated Types

type ToBitStringBuilder (Proxy (MkField MkFieldI16)) a :: Type Source #

BitStringBuilderHoley (Proxy (MkField MkFieldI32)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

Associated Types

type ToBitStringBuilder (Proxy (MkField MkFieldI32)) a :: Type Source #

BitStringBuilderHoley (Proxy (MkField MkFieldI64)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

Associated Types

type ToBitStringBuilder (Proxy (MkField MkFieldI64)) a :: Type Source #

BitStringBuilderHoley (Proxy (MkField MkFieldU8)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

Associated Types

type ToBitStringBuilder (Proxy (MkField MkFieldU8)) a :: Type Source #

BitStringBuilderHoley (Proxy (MkField MkFieldU16)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

Associated Types

type ToBitStringBuilder (Proxy (MkField MkFieldU16)) a :: Type Source #

BitStringBuilderHoley (Proxy (MkField MkFieldU32)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

Associated Types

type ToBitStringBuilder (Proxy (MkField MkFieldU32)) a :: Type Source #

BitStringBuilderHoley (Proxy (MkField MkFieldU64)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

Associated Types

type ToBitStringBuilder (Proxy (MkField MkFieldU64)) a :: Type Source #

(KnownNat v, BitStringBuilderHoley (Proxy f) a, ToBitStringBuilder (Proxy f) a ~ (rt -> a), Num rt) => BitStringBuilderHoley (Proxy (f := v)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

Associated Types

type ToBitStringBuilder (Proxy (f := v)) a :: Type Source #

(KnownNat v, BitStringBuilderHoley (Proxy f) a, ToBitStringBuilder (Proxy f) a ~ (x -> a), Num x) => BitStringBuilderHoley (Proxy (f := NegativeNat v)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

Associated Types

type ToBitStringBuilder (Proxy (f := NegativeNat v)) a :: Type Source #

(KnownNat v, BitStringBuilderHoley (Proxy f) a, ToBitStringBuilder (Proxy f) a ~ (x -> a), Num x) => BitStringBuilderHoley (Proxy (f := PositiveNat v)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

Associated Types

type ToBitStringBuilder (Proxy (f := PositiveNat v)) a :: Type Source #

BitRecordFieldSize f ~ 1 => BitStringBuilderHoley (Proxy (f := False)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

Associated Types

type ToBitStringBuilder (Proxy (f := False)) a :: Type Source #

BitRecordFieldSize f ~ 1 => BitStringBuilderHoley (Proxy (f := True)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

Associated Types

type ToBitStringBuilder (Proxy (f := True)) a :: Type Source #

BitStringBuilderHoley (Proxy nested) a => BitStringBuilderHoley (Proxy (LabelF l nested)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

Associated Types

type ToBitStringBuilder (Proxy (LabelF l nested)) a :: Type Source #

KnownChunkSize s => BitStringBuilderHoley (Proxy (MkField (MkFieldBits :: BitField (B s) Nat s))) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

Associated Types

type ToBitStringBuilder (Proxy (MkField MkFieldBits)) a :: Type Source #

KnownChunkSize size => BitStringBuilderHoley (Proxy (MkField (MkFieldCustom :: BitField (EnumValue e) e size))) r Source # 
Instance details

Defined in Data.Type.BitRecords.Enum

Associated Types

type ToBitStringBuilder (Proxy (MkField MkFieldCustom)) r :: Type Source #

(KnownNat (FromEnum e v), KnownChunkSize size) => BitStringBuilderHoley (Proxy (f := v)) r Source # 
Instance details

Defined in Data.Type.BitRecords.Enum

Associated Types

type ToBitStringBuilder (Proxy (f := v)) r :: Type Source #

BitStringBuilderHoley (Proxy (Eval r)) a => BitStringBuilderHoley (Proxy r) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

Associated Types

type ToBitStringBuilder (Proxy r) a :: Type Source #

BitStringBuilderHoley (Proxy EmptyBitRecord) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

Associated Types

type ToBitStringBuilder (Proxy EmptyBitRecord) a :: Type Source #

BitStringBuilderHoley (Proxy f) a => BitStringBuilderHoley (Proxy (BitRecordMember f)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

Associated Types

type ToBitStringBuilder (Proxy (BitRecordMember f)) a :: Type Source #

(BitStringBuilderHoley (Proxy l) (ToBitStringBuilder (Proxy r) a), BitStringBuilderHoley (Proxy r) a) => BitStringBuilderHoley (Proxy (BitRecordAppend l r)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

Associated Types

type ToBitStringBuilder (Proxy (BitRecordAppend l r)) a :: Type Source #

type Rep1 (Proxy :: k -> Type)

Since: base-4.6.0.0

Instance details

Defined in GHC.Generics

type Rep1 (Proxy :: k -> Type) = D1 (MetaData "Proxy" "Data.Proxy" "base" False) (C1 (MetaCons "Proxy" PrefixI False) (U1 :: k -> Type))
type Rep (Proxy t)

Since: base-4.6.0.0

Instance details

Defined in GHC.Generics

type Rep (Proxy t) = D1 (MetaData "Proxy" "Data.Proxy" "base" False) (C1 (MetaCons "Proxy" PrefixI False) (U1 :: Type -> Type))
type ToBitStringBuilder (Proxy (MkField MkFieldFlag)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

type ToBitStringBuilder (Proxy (MkField MkFieldI8)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

type ToBitStringBuilder (Proxy (MkField MkFieldI16)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

type ToBitStringBuilder (Proxy (MkField MkFieldI32)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

type ToBitStringBuilder (Proxy (MkField MkFieldI64)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

type ToBitStringBuilder (Proxy (MkField MkFieldU8)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

type ToBitStringBuilder (Proxy (MkField MkFieldU16)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

type ToBitStringBuilder (Proxy (MkField MkFieldU32)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

type ToBitStringBuilder (Proxy (MkField MkFieldU64)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

type ToBitStringBuilder (Proxy (f := NegativeNat v)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

type ToBitStringBuilder (Proxy (f := PositiveNat v)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

type ToBitStringBuilder (Proxy (f := v)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

type ToBitStringBuilder (Proxy (f := v)) a = a
type ToBitStringBuilder (Proxy (f := False)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

type ToBitStringBuilder (Proxy (f := False)) a = a
type ToBitStringBuilder (Proxy (f := True)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

type ToBitStringBuilder (Proxy (f := True)) a = a
type ToBitStringBuilder (Proxy (LabelF l nested)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

type ToBitStringBuilder (Proxy (LabelF l nested)) a = ToBitStringBuilder (Proxy nested) a
type ToBitStringBuilder (Proxy (MkField (MkFieldBits :: BitField (B s) Nat s))) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

type ToBitStringBuilder (Proxy (MkField (MkFieldBits :: BitField (B s) Nat s))) a = B s -> a
type ToBitStringBuilder (Proxy (MkField (MkFieldCustom :: BitField (EnumValue e) e size))) r Source # 
Instance details

Defined in Data.Type.BitRecords.Enum

type ToBitStringBuilder (Proxy (f := v)) r Source # 
Instance details

Defined in Data.Type.BitRecords.Enum

type ToBitStringBuilder (Proxy (f := v)) r = r
type ToBitStringBuilder (Proxy r) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

type ToBitStringBuilder (Proxy EmptyBitRecord) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

type ToBitStringBuilder (Proxy (BitRecordMember f)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

type ToBitStringBuilder (Proxy (BitRecordAppend l r)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

data KProxy t #

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

Constructors

KProxy 

outer :: (f a :~: g b) -> f :~: g #

Extract equality of type constructors from an equality of applied types

inner :: (f a :~: g b) -> a :~: b #

Extract equality of the arguments from an equality of applied types

apply :: (f :~: g) -> (a :~: b) -> f a :~: g b #

Apply one equality to another, respectively

gcastWith :: (a :~: b) -> ((a ~ b) -> r) -> r #

Generalized form of type-safe cast using propositional equality

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

Type-safe cast, using propositional equality

trans :: (a :~: b) -> (b :~: c) -> a :~: c #

Transitivity of equality

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

Symmetry of equality

data (a :: k) :~: (b :: k) :: forall k. k -> k -> Type where infix 4 #

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

Since: base-4.7.0.0

Constructors

Refl :: forall k (a :: k) (b :: k). a :~: a 
Instances
Category ((:~:) :: k -> k -> Type)

Since: base-4.7.0.0

Instance details

Defined in Control.Category

Methods

id :: a :~: a #

(.) :: (b :~: c) -> (a :~: b) -> a :~: c #

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

Since: base-4.7.0.0

Instance details

Defined in Data.Type.Equality

Methods

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

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

Since: base-4.7.0.0

Instance details

Defined in Data.Type.Equality

Methods

minBound :: a :~: b #

maxBound :: a :~: b #

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

Since: base-4.7.0.0

Instance details

Defined in Data.Type.Equality

Methods

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

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

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

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

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

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

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

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

Eq (a :~: b)

Since: base-4.7.0.0

Instance details

Defined in Data.Type.Equality

Methods

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

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

Ord (a :~: b)

Since: base-4.7.0.0

Instance details

Defined in Data.Type.Equality

Methods

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

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

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

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

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

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

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

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

Since: base-4.7.0.0

Instance details

Defined in Data.Type.Equality

Methods

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

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

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

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

Show (a :~: b)

Since: base-4.7.0.0

Instance details

Defined in Data.Type.Equality

Methods

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

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

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

data (a :: k1) :~~: (b :: k2) :: forall k1 k2. k1 -> k2 -> Type where infix 4 #

Kind heterogeneous propositional equality. Like :~:, a :~~: b is inhabited by a terminating value if and only if a is the same type as b.

Since: base-4.10.0.0

Constructors

HRefl :: forall k1 k2 (a :: k1) (b :: k2). a :~~: a 
Instances
Category ((:~~:) :: k -> k -> Type)

Since: base-4.10.0.0

Instance details

Defined in Control.Category

Methods

id :: a :~~: a #

(.) :: (b :~~: c) -> (a :~~: b) -> a :~~: c #

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

Since: base-4.10.0.0

Instance details

Defined in Data.Type.Equality

Methods

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

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

Since: base-4.10.0.0

Instance details

Defined in Data.Type.Equality

Methods

minBound :: a :~~: b #

maxBound :: a :~~: b #

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

Since: base-4.10.0.0

Instance details

Defined in Data.Type.Equality

Methods

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

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

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

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

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

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

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

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

Eq (a :~~: b)

Since: base-4.10.0.0

Instance details

Defined in Data.Type.Equality

Methods

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

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

Ord (a :~~: b)

Since: base-4.10.0.0

Instance details

Defined in Data.Type.Equality

Methods

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

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

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

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

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

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

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

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

Since: base-4.10.0.0

Instance details

Defined in Data.Type.Equality

Methods

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

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

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

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

Show (a :~~: b)

Since: base-4.10.0.0

Instance details

Defined in Data.Type.Equality

Methods

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

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

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

class TestEquality (f :: k -> Type) where #

This class contains types where you can learn the equality of two types from information contained in terms. Typically, only singleton types should inhabit this class.

Methods

testEquality :: f a -> f b -> Maybe (a :~: b) #

Conditionally prove the equality of a and b.

Instances
TestEquality (TypeRep :: k -> Type) 
Instance details

Defined in Data.Typeable.Internal

Methods

testEquality :: TypeRep a -> TypeRep b -> Maybe (a :~: b) #

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

Since: base-4.7.0.0

Instance details

Defined in Data.Type.Equality

Methods

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

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

Since: base-4.10.0.0

Instance details

Defined in Data.Type.Equality

Methods

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

type family (a :: k) == (b :: k) :: Bool where ... infix 4 #

A type family to compute Boolean equality.

Equations

(f a :: k2) == (g b :: k2) = (f == g) && (a == b) 
(a :: k) == (a :: k) = True 
(_1 :: k) == (_2 :: k) = False 

byteSwap64 :: Word64 -> Word64 #

Reverse order of bytes in Word64.

Since: base-4.7.0.0

byteSwap32 :: Word32 -> Word32 #

Reverse order of bytes in Word32.

Since: base-4.7.0.0

byteSwap16 :: Word16 -> Word16 #

Swap bytes in Word16.

Since: base-4.7.0.0

toIntegralSized :: (Integral a, Integral b, Bits a, Bits b) => a -> Maybe b #

Attempt to convert an Integral type a to an Integral type b using the size of the types as measured by Bits methods.

A simpler version of this function is:

toIntegral :: (Integral a, Integral b) => a -> Maybe b
toIntegral x
  | toInteger x == y = Just (fromInteger y)
  | otherwise        = Nothing
  where
    y = toInteger x

This version requires going through Integer, which can be inefficient. However, toIntegralSized is optimized to allow GHC to statically determine the relative type sizes (as measured by bitSizeMaybe and isSigned) and avoid going through Integer for many types. (The implementation uses fromIntegral, which is itself optimized with rules for base types but may go through Integer for some type pairs.)

Since: base-4.8.0.0

popCountDefault :: (Bits a, Num a) => a -> Int #

Default implementation for popCount.

This implementation is intentionally naive. Instances are expected to provide an optimized implementation for their size.

Since: base-4.6.0.0

testBitDefault :: (Bits a, Num a) => a -> Int -> Bool #

Default implementation for testBit.

Note that: testBitDefault x i = (x .&. bit i) /= 0

Since: base-4.6.0.0

bitDefault :: (Bits a, Num a) => Int -> a #

Default implementation for bit.

Note that: bitDefault i = 1 shiftL i

Since: base-4.6.0.0

class Eq a => Bits a where #

The Bits class defines bitwise operations over integral types.

  • Bits are numbered from 0 with bit 0 being the least significant bit.

Methods

(.&.) :: a -> a -> a infixl 7 #

Bitwise "and"

(.|.) :: a -> a -> a infixl 5 #

Bitwise "or"

xor :: a -> a -> a infixl 6 #

Bitwise "xor"

complement :: a -> a #

Reverse all the bits in the argument

shift :: a -> Int -> a infixl 8 #

shift x i shifts x left by i bits if i is positive, or right by -i bits otherwise. Right shifts perform sign extension on signed number types; i.e. they fill the top bits with 1 if the x is negative and with 0 otherwise.

An instance can define either this unified shift or shiftL and shiftR, depending on which is more convenient for the type in question.

rotate :: a -> Int -> a infixl 8 #

rotate x i rotates x left by i bits if i is positive, or right by -i bits otherwise.

For unbounded types like Integer, rotate is equivalent to shift.

An instance can define either this unified rotate or rotateL and rotateR, depending on which is more convenient for the type in question.

zeroBits :: a #

zeroBits is the value with all bits unset.

The following laws ought to hold (for all valid bit indices n):

This method uses clearBit (bit 0) 0 as its default implementation (which ought to be equivalent to zeroBits for types which possess a 0th bit).

Since: base-4.7.0.0

bit :: Int -> a #

bit i is a value with the ith bit set and all other bits clear.

Can be implemented using bitDefault if a is also an instance of Num.

See also zeroBits.

setBit :: a -> Int -> a #

x `setBit` i is the same as x .|. bit i

clearBit :: a -> Int -> a #

x `clearBit` i is the same as x .&. complement (bit i)

complementBit :: a -> Int -> a #

x `complementBit` i is the same as x `xor` bit i

testBit :: a -> Int -> Bool #

Return True if the nth bit of the argument is 1

Can be implemented using testBitDefault if a is also an instance of Num.

bitSizeMaybe :: a -> Maybe Int #

Return the number of bits in the type of the argument. The actual value of the argument is ignored. Returns Nothing for types that do not have a fixed bitsize, like Integer.

Since: base-4.7.0.0

bitSize :: a -> Int #

Return the number of bits in the type of the argument. The actual value of the argument is ignored. The function bitSize is undefined for types that do not have a fixed bitsize, like Integer.

Default implementation based upon bitSizeMaybe provided since 4.12.0.0.

isSigned :: a -> Bool #

Return True if the argument is a signed type. The actual value of the argument is ignored

shiftL :: a -> Int -> a infixl 8 #

Shift the argument left by the specified number of bits (which must be non-negative).

An instance can define either this and shiftR or the unified shift, depending on which is more convenient for the type in question.

unsafeShiftL :: a -> Int -> a #

Shift the argument left by the specified number of bits. The result is undefined for negative shift amounts and shift amounts greater or equal to the bitSize.

Defaults to shiftL unless defined explicitly by an instance.

Since: base-4.5.0.0

shiftR :: a -> Int -> a infixl 8 #

Shift the first argument right by the specified number of bits. The result is undefined for negative shift amounts and shift amounts greater or equal to the bitSize.

Right shifts perform sign extension on signed number types; i.e. they fill the top bits with 1 if the x is negative and with 0 otherwise.

An instance can define either this and shiftL or the unified shift, depending on which is more convenient for the type in question.

unsafeShiftR :: a -> Int -> a #

Shift the first argument right by the specified number of bits, which must be non-negative and smaller than the number of bits in the type.

Right shifts perform sign extension on signed number types; i.e. they fill the top bits with 1 if the x is negative and with 0 otherwise.

Defaults to shiftR unless defined explicitly by an instance.

Since: base-4.5.0.0

rotateL :: a -> Int -> a infixl 8 #

Rotate the argument left by the specified number of bits (which must be non-negative).

An instance can define either this and rotateR or the unified rotate, depending on which is more convenient for the type in question.

rotateR :: a -> Int -> a infixl 8 #

Rotate the argument right by the specified number of bits (which must be non-negative).

An instance can define either this and rotateL or the unified rotate, depending on which is more convenient for the type in question.

popCount :: a -> Int #

Return the number of set bits in the argument. This number is known as the population count or the Hamming weight.

Can be implemented using popCountDefault if a is also an instance of Num.

Since: base-4.5.0.0

Instances
Bits Bool

Interpret Bool as 1-bit bit-field

Since: base-4.7.0.0

Instance details

Defined in Data.Bits

Bits Int

Since: base-2.1

Instance details

Defined in Data.Bits

Methods

(.&.) :: Int -> Int -> Int #

(.|.) :: Int -> Int -> Int #

xor :: Int -> Int -> Int #

complement :: Int -> Int #

shift :: Int -> Int -> Int #

rotate :: Int -> Int -> Int #

zeroBits :: Int #

bit :: Int -> Int #

setBit :: Int -> Int -> Int #

clearBit :: Int -> Int -> Int #

complementBit :: Int -> Int -> Int #

testBit :: Int -> Int -> Bool #

bitSizeMaybe :: Int -> Maybe Int #

bitSize :: Int -> Int #

isSigned :: Int -> Bool #

shiftL :: Int -> Int -> Int #

unsafeShiftL :: Int -> Int -> Int #

shiftR :: Int -> Int -> Int #

unsafeShiftR :: Int -> Int -> Int #

rotateL :: Int -> Int -> Int #

rotateR :: Int -> Int -> Int #

popCount :: Int -> Int #

Bits Int8

Since: base-2.1

Instance details

Defined in GHC.Int

Bits Int16

Since: base-2.1

Instance details

Defined in GHC.Int

Bits Int32

Since: base-2.1

Instance details

Defined in GHC.Int

Bits Int64

Since: base-2.1

Instance details

Defined in GHC.Int

Bits Integer

Since: base-2.1

Instance details

Defined in Data.Bits

Bits Natural

Since: base-4.8.0

Instance details

Defined in Data.Bits

Bits Word

Since: base-2.1

Instance details

Defined in Data.Bits

Bits Word8

Since: base-2.1

Instance details

Defined in GHC.Word

Bits Word16

Since: base-2.1

Instance details

Defined in GHC.Word

Bits Word32

Since: base-2.1

Instance details

Defined in GHC.Word

Bits Word64

Since: base-2.1

Instance details

Defined in GHC.Word

Bits CChar 
Instance details

Defined in Foreign.C.Types

Bits CSChar 
Instance details

Defined in Foreign.C.Types

Bits CUChar 
Instance details

Defined in Foreign.C.Types

Bits CShort 
Instance details

Defined in Foreign.C.Types

Bits CUShort 
Instance details

Defined in Foreign.C.Types

Bits CInt 
Instance details

Defined in Foreign.C.Types

Bits CUInt 
Instance details

Defined in Foreign.C.Types

Bits CLong 
Instance details

Defined in Foreign.C.Types

Bits CULong 
Instance details

Defined in Foreign.C.Types

Bits CLLong 
Instance details

Defined in Foreign.C.Types

Bits CULLong 
Instance details

Defined in Foreign.C.Types

Bits CBool 
Instance details

Defined in Foreign.C.Types

Bits CPtrdiff 
Instance details

Defined in Foreign.C.Types

Bits CSize 
Instance details

Defined in Foreign.C.Types

Bits CWchar 
Instance details

Defined in Foreign.C.Types

Bits CSigAtomic 
Instance details

Defined in Foreign.C.Types

Bits CIntPtr 
Instance details

Defined in Foreign.C.Types

Bits CUIntPtr 
Instance details

Defined in Foreign.C.Types

Bits CIntMax 
Instance details

Defined in Foreign.C.Types

Bits CUIntMax 
Instance details

Defined in Foreign.C.Types

Bits TimeScale Source # 
Instance details

Defined in Data.ByteString.IsoBaseFileFormat.Util.Time

Bits a => Bits (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

Bits (B size) Source # 
Instance details

Defined in Data.Type.BitRecords.Core

Methods

(.&.) :: B size -> B size -> B size #

(.|.) :: B size -> B size -> B size #

xor :: B size -> B size -> B size #

complement :: B size -> B size #

shift :: B size -> Int -> B size #

rotate :: B size -> Int -> B size #

zeroBits :: B size #

bit :: Int -> B size #

setBit :: B size -> Int -> B size #

clearBit :: B size -> Int -> B size #

complementBit :: B size -> Int -> B size #

testBit :: B size -> Int -> Bool #

bitSizeMaybe :: B size -> Maybe Int #

bitSize :: B size -> Int #

isSigned :: B size -> Bool #

shiftL :: B size -> Int -> B size #

unsafeShiftL :: B size -> Int -> B size #

shiftR :: B size -> Int -> B size #

unsafeShiftR :: B size -> Int -> B size #

rotateL :: B size -> Int -> B size #

rotateR :: B size -> Int -> B size #

popCount :: B size -> Int #

Bits (Ticks32 timeScale) Source # 
Instance details

Defined in Data.ByteString.IsoBaseFileFormat.Util.Time

Methods

(.&.) :: Ticks32 timeScale -> Ticks32 timeScale -> Ticks32 timeScale #

(.|.) :: Ticks32 timeScale -> Ticks32 timeScale -> Ticks32 timeScale #

xor :: Ticks32 timeScale -> Ticks32 timeScale -> Ticks32 timeScale #

complement :: Ticks32 timeScale -> Ticks32 timeScale #

shift :: Ticks32 timeScale -> Int -> Ticks32 timeScale #

rotate :: Ticks32 timeScale -> Int -> Ticks32 timeScale #

zeroBits :: Ticks32 timeScale #

bit :: Int -> Ticks32 timeScale #

setBit :: Ticks32 timeScale -> Int -> Ticks32 timeScale #

clearBit :: Ticks32 timeScale -> Int -> Ticks32 timeScale #

complementBit :: Ticks32 timeScale -> Int -> Ticks32 timeScale #

testBit :: Ticks32 timeScale -> Int -> Bool #

bitSizeMaybe :: Ticks32 timeScale -> Maybe Int #

bitSize :: Ticks32 timeScale -> Int #

isSigned :: Ticks32 timeScale -> Bool #

shiftL :: Ticks32 timeScale -> Int -> Ticks32 timeScale #

unsafeShiftL :: Ticks32 timeScale -> Int -> Ticks32 timeScale #

shiftR :: Ticks32 timeScale -> Int -> Ticks32 timeScale #

unsafeShiftR :: Ticks32 timeScale -> Int -> Ticks32 timeScale #

rotateL :: Ticks32 timeScale -> Int -> Ticks32 timeScale #

rotateR :: Ticks32 timeScale -> Int -> Ticks32 timeScale #

popCount :: Ticks32 timeScale -> Int #

Bits (Ticks timeScale) Source # 
Instance details

Defined in Data.ByteString.IsoBaseFileFormat.Util.Time

Methods

(.&.) :: Ticks timeScale -> Ticks timeScale -> Ticks timeScale #

(.|.) :: Ticks timeScale -> Ticks timeScale -> Ticks timeScale #

xor :: Ticks timeScale -> Ticks timeScale -> Ticks timeScale #

complement :: Ticks timeScale -> Ticks timeScale #

shift :: Ticks timeScale -> Int -> Ticks timeScale #

rotate :: Ticks timeScale -> Int -> Ticks timeScale #

zeroBits :: Ticks timeScale #

bit :: Int -> Ticks timeScale #

setBit :: Ticks timeScale -> Int -> Ticks timeScale #

clearBit :: Ticks timeScale -> Int -> Ticks timeScale #

complementBit :: Ticks timeScale -> Int -> Ticks timeScale #

testBit :: Ticks timeScale -> Int -> Bool #

bitSizeMaybe :: Ticks timeScale -> Maybe Int #

bitSize :: Ticks timeScale -> Int #

isSigned :: Ticks timeScale -> Bool #

shiftL :: Ticks timeScale -> Int -> Ticks timeScale #

unsafeShiftL :: Ticks timeScale -> Int -> Ticks timeScale #

shiftR :: Ticks timeScale -> Int -> Ticks timeScale #

unsafeShiftR :: Ticks timeScale -> Int -> Ticks timeScale #

rotateL :: Ticks timeScale -> Int -> Ticks timeScale #

rotateR :: Ticks timeScale -> Int -> Ticks timeScale #

popCount :: Ticks timeScale -> Int #

KnownNat bits => Bits (BoxFlags bits) Source # 
Instance details

Defined in Data.ByteString.IsoBaseFileFormat.Util.FullBox

Methods

(.&.) :: BoxFlags bits -> BoxFlags bits -> BoxFlags bits #

(.|.) :: BoxFlags bits -> BoxFlags bits -> BoxFlags bits #

xor :: BoxFlags bits -> BoxFlags bits -> BoxFlags bits #

complement :: BoxFlags bits -> BoxFlags bits #

shift :: BoxFlags bits -> Int -> BoxFlags bits #

rotate :: BoxFlags bits -> Int -> BoxFlags bits #

zeroBits :: BoxFlags bits #

bit :: Int -> BoxFlags bits #

setBit :: BoxFlags bits -> Int -> BoxFlags bits #

clearBit :: BoxFlags bits -> Int -> BoxFlags bits #

complementBit :: BoxFlags bits -> Int -> BoxFlags bits #

testBit :: BoxFlags bits -> Int -> Bool #

bitSizeMaybe :: BoxFlags bits -> Maybe Int #

bitSize :: BoxFlags bits -> Int #

isSigned :: BoxFlags bits -> Bool #

shiftL :: BoxFlags bits -> Int -> BoxFlags bits #

unsafeShiftL :: BoxFlags bits -> Int -> BoxFlags bits #

shiftR :: BoxFlags bits -> Int -> BoxFlags bits #

unsafeShiftR :: BoxFlags bits -> Int -> BoxFlags bits #

rotateL :: BoxFlags bits -> Int -> BoxFlags bits #

rotateR :: BoxFlags bits -> Int -> BoxFlags bits #

popCount :: BoxFlags bits -> Int #

Bits a => Bits (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Methods

(.&.) :: Const a b -> Const a b -> Const a b #

(.|.) :: Const a b -> Const a b -> Const a b #

xor :: Const a b -> Const a b -> Const a b #

complement :: Const a b -> Const a b #

shift :: Const a b -> Int -> Const a b #

rotate :: Const a b -> Int -> Const a b #

zeroBits :: Const a b #

bit :: Int -> Const a b #

setBit :: Const a b -> Int -> Const a b #

clearBit :: Const a b -> Int -> Const a b #

complementBit :: Const a b -> Int -> Const a b #

testBit :: Const a b -> Int -> Bool #

bitSizeMaybe :: Const a b -> Maybe Int #

bitSize :: Const a b -> Int #

isSigned :: Const a b -> Bool #

shiftL :: Const a b -> Int -> Const a b #

unsafeShiftL :: Const a b -> Int -> Const a b #

shiftR :: Const a b -> Int -> Const a b #

unsafeShiftR :: Const a b -> Int -> Const a b #

rotateL :: Const a b -> Int -> Const a b #

rotateR :: Const a b -> Int -> Const a b #

popCount :: Const a b -> Int #

Bits a => Bits (Tagged s a) 
Instance details

Defined in Data.Tagged

Methods

(.&.) :: Tagged s a -> Tagged s a -> Tagged s a #

(.|.) :: Tagged s a -> Tagged s a -> Tagged s a #

xor :: Tagged s a -> Tagged s a -> Tagged s a #

complement :: Tagged s a -> Tagged s a #

shift :: Tagged s a -> Int -> Tagged s a #

rotate :: Tagged s a -> Int -> Tagged s a #

zeroBits :: Tagged s a #

bit :: Int -> Tagged s a #

setBit :: Tagged s a -> Int -> Tagged s a #

clearBit :: Tagged s a -> Int -> Tagged s a #

complementBit :: Tagged s a -> Int -> Tagged s a #

testBit :: Tagged s a -> Int -> Bool #

bitSizeMaybe :: Tagged s a -> Maybe Int #

bitSize :: Tagged s a -> Int #

isSigned :: Tagged s a -> Bool #

shiftL :: Tagged s a -> Int -> Tagged s a #

unsafeShiftL :: Tagged s a -> Int -> Tagged s a #

shiftR :: Tagged s a -> Int -> Tagged s a #

unsafeShiftR :: Tagged s a -> Int -> Tagged s a #

rotateL :: Tagged s a -> Int -> Tagged s a #

rotateR :: Tagged s a -> Int -> Tagged s a #

popCount :: Tagged s a -> Int #

class Bits b => FiniteBits b where #

The FiniteBits class denotes types with a finite, fixed number of bits.

Since: base-4.7.0.0

Minimal complete definition

finiteBitSize

Methods

finiteBitSize :: b -> Int #

Return the number of bits in the type of the argument. The actual value of the argument is ignored. Moreover, finiteBitSize is total, in contrast to the deprecated bitSize function it replaces.

finiteBitSize = bitSize
bitSizeMaybe = Just . finiteBitSize

Since: base-4.7.0.0

countLeadingZeros :: b -> Int #

Count number of zero bits preceding the most significant set bit.

countLeadingZeros (zeroBits :: a) = finiteBitSize (zeroBits :: a)

countLeadingZeros can be used to compute log base 2 via

logBase2 x = finiteBitSize x - 1 - countLeadingZeros x

Note: The default implementation for this method is intentionally naive. However, the instances provided for the primitive integral types are implemented using CPU specific machine instructions.

Since: base-4.8.0.0

countTrailingZeros :: b -> Int #

Count number of zero bits following the least significant set bit.

countTrailingZeros (zeroBits :: a) = finiteBitSize (zeroBits :: a)
countTrailingZeros . negate = countTrailingZeros

The related find-first-set operation can be expressed in terms of countTrailingZeros as follows

findFirstSet x = 1 + countTrailingZeros x

Note: The default implementation for this method is intentionally naive. However, the instances provided for the primitive integral types are implemented using CPU specific machine instructions.

Since: base-4.8.0.0

Instances
FiniteBits Bool

Since: base-4.7.0.0

Instance details

Defined in Data.Bits

FiniteBits Int

Since: base-4.6.0.0

Instance details

Defined in Data.Bits

FiniteBits Int8

Since: base-4.6.0.0

Instance details

Defined in GHC.Int

FiniteBits Int16

Since: base-4.6.0.0

Instance details

Defined in GHC.Int

FiniteBits Int32

Since: base-4.6.0.0

Instance details

Defined in GHC.Int

FiniteBits Int64

Since: base-4.6.0.0

Instance details

Defined in GHC.Int

FiniteBits Word

Since: base-4.6.0.0

Instance details

Defined in Data.Bits

FiniteBits Word8

Since: base-4.6.0.0

Instance details

Defined in GHC.Word

FiniteBits Word16

Since: base-4.6.0.0

Instance details

Defined in GHC.Word

FiniteBits Word32

Since: base-4.6.0.0

Instance details

Defined in GHC.Word

FiniteBits Word64

Since: base-4.6.0.0

Instance details

Defined in GHC.Word

FiniteBits CChar 
Instance details

Defined in Foreign.C.Types

FiniteBits CSChar 
Instance details

Defined in Foreign.C.Types

FiniteBits CUChar 
Instance details

Defined in Foreign.C.Types

FiniteBits CShort 
Instance details

Defined in Foreign.C.Types

FiniteBits CUShort 
Instance details

Defined in Foreign.C.Types

FiniteBits CInt 
Instance details

Defined in Foreign.C.Types

FiniteBits CUInt 
Instance details

Defined in Foreign.C.Types

FiniteBits CLong 
Instance details

Defined in Foreign.C.Types

FiniteBits CULong 
Instance details

Defined in Foreign.C.Types

FiniteBits CLLong 
Instance details

Defined in Foreign.C.Types

FiniteBits CULLong 
Instance details

Defined in Foreign.C.Types

FiniteBits CBool 
Instance details

Defined in Foreign.C.Types

FiniteBits CPtrdiff 
Instance details

Defined in Foreign.C.Types

FiniteBits CSize 
Instance details

Defined in Foreign.C.Types

FiniteBits CWchar 
Instance details

Defined in Foreign.C.Types

FiniteBits CSigAtomic 
Instance details

Defined in Foreign.C.Types

FiniteBits CIntPtr 
Instance details

Defined in Foreign.C.Types

FiniteBits CUIntPtr 
Instance details

Defined in Foreign.C.Types

FiniteBits CIntMax 
Instance details

Defined in Foreign.C.Types

FiniteBits CUIntMax 
Instance details

Defined in Foreign.C.Types

FiniteBits a => FiniteBits (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

FiniteBits (B size) Source # 
Instance details

Defined in Data.Type.BitRecords.Core

Methods

finiteBitSize :: B size -> Int #

countLeadingZeros :: B size -> Int #

countTrailingZeros :: B size -> Int #

FiniteBits a => FiniteBits (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

FiniteBits a => FiniteBits (Tagged s a) 
Instance details

Defined in Data.Tagged

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

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

Equations

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

type family (a :: Bool) && (b :: Bool) :: Bool where ... infixr 3 #

Type-level "and"

Equations

False && a = False 
True && a = a 
a && False = False 
a && True = a 
a && a = a 

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

Type-level "or"

Equations

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

type family Not (a :: Bool) = (res :: Bool) | res -> a where ... #

Type-level "not". An injective type family since 4.10.0.0.

Since: base-4.7.0.0

Equations

Not False = True 
Not True = False 

mapMaybe :: (a -> Maybe b) -> [a] -> [b] #

The mapMaybe function is a version of map which can throw out elements. In particular, the functional argument returns something of type Maybe b. If this is Nothing, no element is added on to the result list. If it is Just b, then b is included in the result list.

Examples

Expand

Using mapMaybe f x is a shortcut for catMaybes $ map f x in most cases:

>>> import Text.Read ( readMaybe )
>>> let readMaybeInt = readMaybe :: String -> Maybe Int
>>> mapMaybe readMaybeInt ["1", "Foo", "3"]
[1,3]
>>> catMaybes $ map readMaybeInt ["1", "Foo", "3"]
[1,3]

If we map the Just constructor, the entire list should be returned:

>>> mapMaybe Just [1,2,3]
[1,2,3]

catMaybes :: [Maybe a] -> [a] #

The catMaybes function takes a list of Maybes and returns a list of all the Just values.

Examples

Expand

Basic usage:

>>> catMaybes [Just 1, Nothing, Just 3]
[1,3]

When constructing a list of Maybe values, catMaybes can be used to return all of the "success" results (if the list is the result of a map, then mapMaybe would be more appropriate):

>>> import Text.Read ( readMaybe )
>>> [readMaybe x :: Maybe Int | x <- ["1", "Foo", "3"] ]
[Just 1,Nothing,Just 3]
>>> catMaybes $ [readMaybe x :: Maybe Int | x <- ["1", "Foo", "3"] ]
[1,3]

listToMaybe :: [a] -> Maybe a #

The listToMaybe function returns Nothing on an empty list or Just a where a is the first element of the list.

Examples

Expand

Basic usage:

>>> listToMaybe []
Nothing
>>> listToMaybe [9]
Just 9
>>> listToMaybe [1,2,3]
Just 1

Composing maybeToList with listToMaybe should be the identity on singleton/empty lists:

>>> maybeToList $ listToMaybe [5]
[5]
>>> maybeToList $ listToMaybe []
[]

But not on lists with more than one element:

>>> maybeToList $ listToMaybe [1,2,3]
[1]

maybeToList :: Maybe a -> [a] #

The maybeToList function returns an empty list when given Nothing or a singleton list when not given Nothing.

Examples

Expand

Basic usage:

>>> maybeToList (Just 7)
[7]
>>> maybeToList Nothing
[]

One can use maybeToList to avoid pattern matching when combined with a function that (safely) works on lists:

>>> import Text.Read ( readMaybe )
>>> sum $ maybeToList (readMaybe "3")
3
>>> sum $ maybeToList (readMaybe "")
0

fromMaybe :: a -> Maybe a -> a #

The fromMaybe function takes a default value and and Maybe value. If the Maybe is Nothing, it returns the default values; otherwise, it returns the value contained in the Maybe.

Examples

Expand

Basic usage:

>>> fromMaybe "" (Just "Hello, World!")
"Hello, World!"
>>> fromMaybe "" Nothing
""

Read an integer from a string using readMaybe. If we fail to parse an integer, we want to return 0 by default:

>>> import Text.Read ( readMaybe )
>>> fromMaybe 0 (readMaybe "5")
5
>>> fromMaybe 0 (readMaybe "")
0

fromJust :: Maybe a -> a #

The fromJust function extracts the element out of a Just and throws an error if its argument is Nothing.

Examples

Expand

Basic usage:

>>> fromJust (Just 1)
1
>>> 2 * (fromJust (Just 10))
20
>>> 2 * (fromJust Nothing)
*** Exception: Maybe.fromJust: Nothing

isNothing :: Maybe a -> Bool #

The isNothing function returns True iff its argument is Nothing.

Examples

Expand

Basic usage:

>>> isNothing (Just 3)
False
>>> isNothing (Just ())
False
>>> isNothing Nothing
True

Only the outer constructor is taken into consideration:

>>> isNothing (Just Nothing)
False

isJust :: Maybe a -> Bool #

The isJust function returns True iff its argument is of the form Just _.

Examples

Expand

Basic usage:

>>> isJust (Just 3)
True
>>> isJust (Just ())
True
>>> isJust Nothing
False

Only the outer constructor is taken into consideration:

>>> isJust (Just Nothing)
True

maybe :: b -> (a -> b) -> Maybe a -> b #

The maybe function takes a default value, a function, and a Maybe value. If the Maybe value is Nothing, the function returns the default value. Otherwise, it applies the function to the value inside the Just and returns the result.

Examples

Expand

Basic usage:

>>> maybe False odd (Just 3)
True
>>> maybe False odd Nothing
False

Read an integer from a string using readMaybe. If we succeed, return twice the integer; that is, apply (*2) to it. If instead we fail to parse an integer, return 0 by default:

>>> import Text.Read ( readMaybe )
>>> maybe 0 (*2) (readMaybe "5")
10
>>> maybe 0 (*2) (readMaybe "")
0

Apply show to a Maybe Int. If we have Just n, we want to show the underlying Int n. But if we have Nothing, we return the empty string instead of (for example) "Nothing":

>>> maybe "" show (Just 5)
"5"
>>> maybe "" show Nothing
""

type String = [Char] #

A String is a list of characters. String constants in Haskell are values of type String.

data Builder #

Builders denote sequences of bytes. They are Monoids where mempty is the zero-length sequence and mappend is concatenation, which runs in O(1).

toLazyByteString :: Builder -> ByteString #

Execute a Builder and return the generated chunks as a lazy ByteString. The work is performed lazy, i.e., only when a chunk of the lazy ByteString is forced.

stringUtf8 :: String -> Builder #

UTF-8 encode a String.

charUtf8 :: Char -> Builder #

UTF-8 encode a Char.

string8 :: String -> Builder #

Char8 encode a String.

char8 :: Char -> Builder #

Char8 encode a Char.

string7 :: String -> Builder #

Char7 encode a String.

char7 :: Char -> Builder #

Char7 encode a Char.

doubleBE :: Double -> Builder #

Encode a Double in big endian format.

floatBE :: Float -> Builder #

Encode a Float in big endian format.

word64BE :: Word64 -> Builder #

Encode a Word64 in big endian format.

word32BE :: Word32 -> Builder #

Encode a Word32 in big endian format.

word16BE :: Word16 -> Builder #

Encode a Word16 in big endian format.

int64BE :: Int64 -> Builder #

Encode an Int64 in big endian format.

int32BE :: Int32 -> Builder #

Encode an Int32 in big endian format.

int16BE :: Int16 -> Builder #

Encode an Int16 in big endian format.

doubleLE :: Double -> Builder #

Encode a Double in little endian format.

floatLE :: Float -> Builder #

Encode a Float in little endian format.

word64LE :: Word64 -> Builder #

Encode a Word64 in little endian format.

word32LE :: Word32 -> Builder #

Encode a Word32 in little endian format.

word16LE :: Word16 -> Builder #

Encode a Word16 in little endian format.

int64LE :: Int64 -> Builder #

Encode an Int64 in little endian format.

int32LE :: Int32 -> Builder #

Encode an Int32 in little endian format.

int16LE :: Int16 -> Builder #

Encode an Int16 in little endian format.

word8 :: Word8 -> Builder #

Encode a single unsigned byte as-is.

int8 :: Int8 -> Builder #

Encode a single signed byte as-is.

hPutBuilder :: Handle -> Builder -> IO () #

Output a Builder to a Handle. The Builder is executed directly on the buffer of the Handle. If the buffer is too small (or not present), then it is replaced with a large enough buffer.

It is recommended that the Handle is set to binary and BlockBuffering mode. See hSetBinaryMode and hSetBuffering.

This function is more efficient than hPut . toLazyByteString because in many cases no buffer allocation has to be done. Moreover, the results of several executions of short Builders are concatenated in the Handles buffer, therefore avoiding unnecessary buffer flushes.

integerDec :: Integer -> Builder #

Decimal encoding of an Integer using the ASCII digits.

lazyByteStringHex :: ByteString -> Builder #

Encode each byte of a lazy ByteString using its fixed-width hex encoding.

byteStringHex :: ByteString -> Builder #

Encode each byte of a ByteString using its fixed-width hex encoding.

doubleHexFixed :: Double -> Builder #

Encode an IEEE Double using 16 nibbles.

floatHexFixed :: Float -> Builder #

Encode an IEEE Float using 8 nibbles.

word64HexFixed :: Word64 -> Builder #

Encode a Word64 using 16 nibbles.

word32HexFixed :: Word32 -> Builder #

Encode a Word32 using 8 nibbles.

word16HexFixed :: Word16 -> Builder #

Encode a Word16 using 4 nibbles.

word8HexFixed :: Word8 -> Builder #

Encode a Word8 using 2 nibbles (hexadecimal digits).

int64HexFixed :: Int64 -> Builder #

Encode a Int64 using 16 nibbles.

int32HexFixed :: Int32 -> Builder #

Encode a Int32 using 8 nibbles.

int16HexFixed :: Int16 -> Builder #

Encode a Int16 using 4 nibbles.

int8HexFixed :: Int8 -> Builder #

Encode a Int8 using 2 nibbles (hexadecimal digits).

wordHex :: Word -> Builder #

Shortest hexadecimal encoding of a Word using lower-case characters.

word64Hex :: Word64 -> Builder #

Shortest hexadecimal encoding of a Word64 using lower-case characters.

word32Hex :: Word32 -> Builder #

Shortest hexadecimal encoding of a Word32 using lower-case characters.

word16Hex :: Word16 -> Builder #

Shortest hexadecimal encoding of a Word16 using lower-case characters.

word8Hex :: Word8 -> Builder #

Shortest hexadecimal encoding of a Word8 using lower-case characters.

doubleDec :: Double -> Builder #

Currently slow. Decimal encoding of an IEEE Double.

floatDec :: Float -> Builder #

Currently slow. Decimal encoding of an IEEE Float.

wordDec :: Word -> Builder #

Decimal encoding of a Word using the ASCII digits.

word64Dec :: Word64 -> Builder #

Decimal encoding of a Word64 using the ASCII digits.

word32Dec :: Word32 -> Builder #

Decimal encoding of a Word32 using the ASCII digits.

word16Dec :: Word16 -> Builder #

Decimal encoding of a Word16 using the ASCII digits.

word8Dec :: Word8 -> Builder #

Decimal encoding of a Word8 using the ASCII digits.

intDec :: Int -> Builder #

Decimal encoding of an Int using the ASCII digits.

int64Dec :: Int64 -> Builder #

Decimal encoding of an Int64 using the ASCII digits.

int32Dec :: Int32 -> Builder #

Decimal encoding of an Int32 using the ASCII digits.

int16Dec :: Int16 -> Builder #

Decimal encoding of an Int16 using the ASCII digits.

int8Dec :: Int8 -> Builder #

Decimal encoding of an Int8 using the ASCII digits.

e.g.

toLazyByteString (int8Dec 42)   = "42"
toLazyByteString (int8Dec (-1)) = "-1"

lazyByteString :: ByteString -> Builder #

Create a Builder denoting the same sequence of bytes as a lazy ByteString. The Builder inserts large chunks of the lazy ByteString directly, but copies small ones to ensure that the generated chunks are large on average.

byteString :: ByteString -> Builder #

Create a Builder denoting the same sequence of bytes as a strict ByteString. The Builder inserts large ByteStrings directly, but copies small ones to ensure that the generated chunks are large on average.

class Default a where #

A class for types with a default value.

Minimal complete definition

Nothing

Methods

def :: a #

The default value for this type.

Instances
Default Double 
Instance details

Defined in Data.Default.Class

Methods

def :: Double #

Default Float 
Instance details

Defined in Data.Default.Class

Methods

def :: Float #

Default Int 
Instance details

Defined in Data.Default.Class

Methods

def :: Int #

Default Int8 
Instance details

Defined in Data.Default.Class

Methods

def :: Int8 #

Default Int16 
Instance details

Defined in Data.Default.Class

Methods

def :: Int16 #

Default Int32 
Instance details

Defined in Data.Default.Class

Methods

def :: Int32 #

Default Int64 
Instance details

Defined in Data.Default.Class

Methods

def :: Int64 #

Default Integer 
Instance details

Defined in Data.Default.Class

Methods

def :: Integer #

Default Ordering 
Instance details

Defined in Data.Default.Class

Methods

def :: Ordering #

Default Word 
Instance details

Defined in Data.Default.Class

Methods

def :: Word #

Default Word8 
Instance details

Defined in Data.Default.Class

Methods

def :: Word8 #

Default Word16 
Instance details

Defined in Data.Default.Class

Methods

def :: Word16 #

Default Word32 
Instance details

Defined in Data.Default.Class

Methods

def :: Word32 #

Default Word64 
Instance details

Defined in Data.Default.Class

Methods

def :: Word64 #

Default () 
Instance details

Defined in Data.Default.Class

Methods

def :: () #

Default All 
Instance details

Defined in Data.Default.Class

Methods

def :: All #

Default Any 
Instance details

Defined in Data.Default.Class

Methods

def :: Any #

Default CShort 
Instance details

Defined in Data.Default.Class

Methods

def :: CShort #

Default CUShort 
Instance details

Defined in Data.Default.Class

Methods

def :: CUShort #

Default CInt 
Instance details

Defined in Data.Default.Class

Methods

def :: CInt #

Default CUInt 
Instance details

Defined in Data.Default.Class

Methods

def :: CUInt #

Default CLong 
Instance details

Defined in Data.Default.Class

Methods

def :: CLong #

Default CULong 
Instance details

Defined in Data.Default.Class

Methods

def :: CULong #

Default CLLong 
Instance details

Defined in Data.Default.Class

Methods

def :: CLLong #

Default CULLong 
Instance details

Defined in Data.Default.Class

Methods

def :: CULLong #

Default CFloat 
Instance details

Defined in Data.Default.Class

Methods

def :: CFloat #

Default CDouble 
Instance details

Defined in Data.Default.Class

Methods

def :: CDouble #

Default CPtrdiff 
Instance details

Defined in Data.Default.Class

Methods

def :: CPtrdiff #

Default CSize 
Instance details

Defined in Data.Default.Class

Methods

def :: CSize #

Default CSigAtomic 
Instance details

Defined in Data.Default.Class

Methods

def :: CSigAtomic #

Default CClock 
Instance details

Defined in Data.Default.Class

Methods

def :: CClock #

Default CTime 
Instance details

Defined in Data.Default.Class

Methods

def :: CTime #

Default CUSeconds 
Instance details

Defined in Data.Default.Class

Methods

def :: CUSeconds #

Default CSUSeconds 
Instance details

Defined in Data.Default.Class

Methods

def :: CSUSeconds #

Default CIntPtr 
Instance details

Defined in Data.Default.Class

Methods

def :: CIntPtr #

Default CUIntPtr 
Instance details

Defined in Data.Default.Class

Methods

def :: CUIntPtr #

Default CIntMax 
Instance details

Defined in Data.Default.Class

Methods

def :: CIntMax #

Default CUIntMax 
Instance details

Defined in Data.Default.Class

Methods

def :: CUIntMax #

Default ByteString Source # 
Instance details

Defined in Data.ByteString.IsoBaseFileFormat.ReExports

Methods

def :: ByteString #

Default Text Source # 
Instance details

Defined in Data.ByteString.IsoBaseFileFormat.ReExports

Methods

def :: Text #

Default TimeScale Source # 
Instance details

Defined in Data.ByteString.IsoBaseFileFormat.Util.Time

Methods

def :: TimeScale #

Default TrackFragmentHeader Source # 
Instance details

Defined in Data.ByteString.IsoBaseFileFormat.Boxes.TrackFragmentHeader

Default TimeToSampleTable Source # 
Instance details

Defined in Data.ByteString.IsoBaseFileFormat.Boxes.TimeToSample

Default SampleToChunkTable Source # 
Instance details

Defined in Data.ByteString.IsoBaseFileFormat.Boxes.SampleToChunk

Default SampleDescription Source # 
Instance details

Defined in Data.ByteString.IsoBaseFileFormat.Boxes.SampleDescription

Default NullMediaHeader Source # 
Instance details

Defined in Data.ByteString.IsoBaseFileFormat.Boxes.NullMediaHeader

Default MovieFragmentHeader Source # 
Instance details

Defined in Data.ByteString.IsoBaseFileFormat.Boxes.MovieFragmentHeader

Default Language Source # 
Instance details

Defined in Data.ByteString.IsoBaseFileFormat.Boxes.Language

Methods

def :: Language #

Default FullRangeFlag Source # 
Instance details

Defined in Data.ByteString.IsoBaseFileFormat.Boxes.VisualSampleEntry

Methods

def :: FullRangeFlag #

Default PixelAspectRatio Source # 
Instance details

Defined in Data.ByteString.IsoBaseFileFormat.Boxes.VisualSampleEntry

Default CleanAperture Source # 
Instance details

Defined in Data.ByteString.IsoBaseFileFormat.Boxes.VisualSampleEntry

Methods

def :: CleanAperture #

Default VideoMediaHeader Source # 
Instance details

Defined in Data.ByteString.IsoBaseFileFormat.Boxes.VideoMediaHeader

Default SoundMediaHeader Source # 
Instance details

Defined in Data.ByteString.IsoBaseFileFormat.Boxes.SoundMediaHeader

Default BitRate Source # 
Instance details

Defined in Data.ByteString.IsoBaseFileFormat.Boxes.MetaDataSampleEntry

Methods

def :: BitRate #

Default UriInitField Source # 
Instance details

Defined in Data.ByteString.IsoBaseFileFormat.Boxes.MetaDataSampleEntry

Methods

def :: UriInitField #

Default UriField Source # 
Instance details

Defined in Data.ByteString.IsoBaseFileFormat.Boxes.MetaDataSampleEntry

Methods

def :: UriField #

Default HintMediaHeader Source # 
Instance details

Defined in Data.ByteString.IsoBaseFileFormat.Boxes.HintMediaHeader

Default DataEntryUrl Source # 
Instance details

Defined in Data.ByteString.IsoBaseFileFormat.Boxes.DataEntryUrl

Methods

def :: DataEntryUrl #

Default DataReference Source # 
Instance details

Defined in Data.ByteString.IsoBaseFileFormat.Boxes.DataReference

Methods

def :: DataReference #

Default [a] 
Instance details

Defined in Data.Default.Class

Methods

def :: [a] #

Default (Maybe a) 
Instance details

Defined in Data.Default.Class

Methods

def :: Maybe a #

Integral a => Default (Ratio a) 
Instance details

Defined in Data.Default.Class

Methods

def :: Ratio a #

Default a => Default (IO a) 
Instance details

Defined in Data.Default.Class

Methods

def :: IO a #

(Default a, RealFloat a) => Default (Complex a) 
Instance details

Defined in Data.Default.Class

Methods

def :: Complex a #

Default (First a) 
Instance details

Defined in Data.Default.Class

Methods

def :: First a #

Default (Last a) 
Instance details

Defined in Data.Default.Class

Methods

def :: Last a #

Default a => Default (Dual a) 
Instance details

Defined in Data.Default.Class

Methods

def :: Dual a #

Default (Endo a) 
Instance details

Defined in Data.Default.Class

Methods

def :: Endo a #

Num a => Default (Sum a) 
Instance details

Defined in Data.Default.Class

Methods

def :: Sum a #

Num a => Default (Product a) 
Instance details

Defined in Data.Default.Class

Methods

def :: Product a #

Default (BoxContent b) => Default (Box b) Source # 
Instance details

Defined in Data.ByteString.IsoBaseFileFormat.Box

Methods

def :: Box b #

Default (U32Text label) Source # 
Instance details

Defined in Data.ByteString.IsoBaseFileFormat.Util.BoxFields

Methods

def :: U32Text label #

Default (Handler t) Source # 
Instance details

Defined in Data.ByteString.IsoBaseFileFormat.Boxes.Handler

Methods

def :: Handler t #

Default (ColourType profile) => Default (ColourInformation profile) Source # 
Instance details

Defined in Data.ByteString.IsoBaseFileFormat.Boxes.VisualSampleEntry

Methods

def :: ColourInformation profile #

Default c => Default (VideoSampleEntry c) Source # 
Instance details

Defined in Data.ByteString.IsoBaseFileFormat.Boxes.VisualSampleEntry

Methods

def :: VideoSampleEntry c #

Default handlerSpecific => Default (SampleEntry handlerSpecific) Source # 
Instance details

Defined in Data.ByteString.IsoBaseFileFormat.Boxes.SampleEntry

Methods

def :: SampleEntry handlerSpecific #

Default (MetaDataCoding "mett") Source # 
Instance details

Defined in Data.ByteString.IsoBaseFileFormat.Boxes.MetaDataSampleEntry

Methods

def :: MetaDataCoding "mett" #

Default (MetaDataCoding "metx") Source # 
Instance details

Defined in Data.ByteString.IsoBaseFileFormat.Boxes.MetaDataSampleEntry

Methods

def :: MetaDataCoding "metx" #

Default (MetaDataCoding "urim") Source # 
Instance details

Defined in Data.ByteString.IsoBaseFileFormat.Boxes.MetaDataSampleEntry

Methods

def :: MetaDataCoding "urim" #

Default (ChunkOffsetTable stcoEntry) Source # 
Instance details

Defined in Data.ByteString.IsoBaseFileFormat.Boxes.ChunkOffset

Methods

def :: ChunkOffsetTable stcoEntry #

Default b => Default (AudioSampleEntry b) Source # 
Instance details

Defined in Data.ByteString.IsoBaseFileFormat.Boxes.AudioSampleEntry

Methods

def :: AudioSampleEntry b #

Default r => Default (e -> r) 
Instance details

Defined in Data.Default.Class

Methods

def :: e -> r #

(Default a, Default b) => Default (a, b) 
Instance details

Defined in Data.Default.Class

Methods

def :: (a, b) #

(Default a, Default b) => Default (a :+ b) Source # 
Instance details

Defined in Data.ByteString.IsoBaseFileFormat.Box

Methods

def :: a :+ b #

(KnownNat version, IsBox t, Default (BoxContent t)) => Default (FullBox t version) Source # 
Instance details

Defined in Data.ByteString.IsoBaseFileFormat.Util.FullBox

Methods

def :: FullBox t version #

IsTextSize len => Default (FixSizeText len label) Source # 
Instance details

Defined in Data.ByteString.IsoBaseFileFormat.Util.BoxFields

Methods

def :: FixSizeText len label #

(Default a, Default b, Default c) => Default (a, b, c) 
Instance details

Defined in Data.Default.Class

Methods

def :: (a, b, c) #

Default c => Default (Tagged s c) Source # 
Instance details

Defined in Data.ByteString.IsoBaseFileFormat.ReExports

Methods

def :: Tagged s c #

Default (ListContent sizeTupe contentType) Source # 
Instance details

Defined in Data.ByteString.IsoBaseFileFormat.Box

Methods

def :: ListContent sizeTupe contentType #

(version ~ 0, IsBoxContent v0, Default v0) => Default (Versioned v0 v1 version) Source # 
Instance details

Defined in Data.ByteString.IsoBaseFileFormat.Util.Versioned

Methods

def :: Versioned v0 v1 version #

Default (Template o v) Source # 
Instance details

Defined in Data.ByteString.IsoBaseFileFormat.Util.BoxFields

Methods

def :: Template o v #

Default scalartype => Default (Scalar scalartype label) Source # 
Instance details

Defined in Data.ByteString.IsoBaseFileFormat.Util.BoxFields

Methods

def :: Scalar scalartype label #

(Default a, Default b, Default c, Default d) => Default (a, b, c, d) 
Instance details

Defined in Data.Default.Class

Methods

def :: (a, b, c, d) #

Default (Constant o v) Source # 
Instance details

Defined in Data.ByteString.IsoBaseFileFormat.Util.BoxFields

Methods

def :: Constant o v #

(Default o, KnownNat len) => Default (ScalarArray label len o) Source # 
Instance details

Defined in Data.ByteString.IsoBaseFileFormat.Util.BoxFields

Methods

def :: ScalarArray label len o #

(Default a, Default b, Default c, Default d, Default e) => Default (a, b, c, d, e) 
Instance details

Defined in Data.Default.Class

Methods

def :: (a, b, c, d, e) #

(Default a, Default b, Default c, Default d, Default e, Default f) => Default (a, b, c, d, e, f) 
Instance details

Defined in Data.Default.Class

Methods

def :: (a, b, c, d, e, f) #

(Default a, Default b, Default c, Default d, Default e, Default f, Default g) => Default (a, b, c, d, e, f, g) 
Instance details

Defined in Data.Default.Class

Methods

def :: (a, b, c, d, e, f, g) #

mapNext :: (s -> r) -> FunctionBuilder m r a -> FunctionBuilder m s a #

Convert the output of a FunctionBuilder value; since most FunctionBuilders are parameteric in r they also have r in a in a, such that a always either is r or is a function returning r eventually.

In order to get from a FunctionBuilder that can accept a continuation returning it an r to a FunctionBuilder that accepts continuations returning an s instead, we need to apply a function s -> r to the return value of the continuation.

Note that a mapNext will not only change the r to an s but probably also the the a, when it is parametric, as in this contrived example:

example :: Int -> x -> Sum Int
example = toFunction (ign add)

add :: FunctionBuilder (Sum Int) next (Int -> next)
add = FB (\k x -> k $ Sum x)

ign :: FunctionBuilder m (x -> r) a -> FunctionBuilder m r a
ign = mapNext const

Here the extra parameter x is pushed down into the a of the add FunctionBuilder.

mapAccumulator :: (m -> n) -> FunctionBuilder m a b -> FunctionBuilder n a b #

Convert the accumulated (usually monoidal-) value, this allows to change the underlying accumlator type.

bind :: FunctionBuilder m g_next f_g_next -> (m -> FunctionBuilder n next g_next) -> FunctionBuilder n next f_g_next #

Compose to FunctionBuilders such that the second FunctionBuilder may depend on the intermediate result of the first. Similar to a monadic bind >>= but more flexible sind the underlying Monoid may change too, for example:

intText :: FunctionBuilder Text next (Int -> next)
intText = addParameter undefined

unpackB :: Text -> FunctionBuilder String next next
unpackB = immediate . unpack

intStr :: FunctionBuilder String next (Int -> next)
intStr = intText `bind` unpackB

tagParameter :: FunctionBuilder m r (a -> b) -> FunctionBuilder m r (Tagged tag a -> b) #

Convert a FunctionBuilder for a function (a -> b) to (Tagged tag a -> b).

fillParameter :: FunctionBuilder m r (a -> b) -> a -> FunctionBuilder m r b #

Take away a function parameter added with addParameter by pre - applying it to some value.

For example:

intArg :: FunctionBuilder MyMonoid a (Int -> a)
intArg = addParameter undefined

stringArg :: FunctionBuilder MyMonoid a (String -> a)
stringArg = addParameter undefined

twoInt :: FunctionBuilder MyMonoid a (Int -> String -> a)
twoInt = intArg . stringArg

example :: FunctionBuilder MyMonoid a (String -> a)
example = fillParameter twoInt 42

This is equivalent to:

    fillParameter f x = f * pure x

addParameter :: (a -> m) -> FunctionBuilder m r (a -> r) #

Create a FunctionBuilder that adds an argument to the output function, and converts that argument to a value that can be accumulated in the resulting monoidal value.

This is a smart constructor for a FunctionBuilder. This functions is probably equal to:

addParameter f = FB (\k x -> k (f x))

The generated builder can be passed to toFunction since it is parametric in its second type parameter.

Example:

When building a String formatting FunctionBuilder the function to append a parameter that has a show instance could be:

showing :: Show a => FunctionBuilder String r (a -> r)
showing = addParameter show
example :: (Show a, Show b) => a -> b -> String
example = toFunction (showing . showing)
>>> example True 0.33214
"True0.33214"

See the example in toFunction.

immediate :: m -> FunctionBuilder m r r #

Create a FunctionBuilder that appends something to the (monoidal-) output value.

This is a smart constructor for a FunctionBuilder. This functions is probably equal to:

immediate x = FB (\k -> k x)

The generated builder can be passed to toFunction since it is parametric in its second type parameter.

Example:

When building a String formatting FunctionBuilder the function to append a literal string could be:

s :: String -> FunctionBuilder String a a
s = immediate
c :: Char -> FunctionBuilder String a a
c = immediate . (:[])
example :: String
example = toFunction (s "hello" . c ' ' . s "world")
>>> example
"hello world"

See the example in toFunction.

toFunction :: FunctionBuilder output output make_output -> make_output #

Get the composed output function of a FunctionBuilder.

The FunctionBuilder passed to this function must match this signature:

FunctionBuilder m m (arg0 -> .. -> m)

This means that the result of the generated function arg0 -> .. -> m MUST be m, the underlying Monoid.

The FunctionBuilders generated by addParameter and immediate are parametric in the second type parameter and match the type signature required by this function.

Example 1:

fb :: FunctionBuilder String String (Int -> Double -> Int -> String)
fb = undefined

example :: Int -> Double -> Int -> String
example = toFunction  fb

Example 2:

example :: Int -> Double -> Int -> String
example = toFunction (i . d . i)

s :: String -> FunctionBuilder String a a
s x = FB (\k -> k x)

i :: FunctionBuilder String next (Int -> next)
i = FB (\k x -> k $ show x)

d :: FunctionBuilder String next (Double -> next)
d = FB (\k x -> k $ show x)

newtype FunctionBuilder acc next f_make_next #

A tricky newtype wrapper around a function that carries out a computation resulting in a monoidal output value that is passed to a continuation.

Type parameters:

acc
Type of monoidal value that is build from the parameters of the function returned by toFunction. For example: In a printf style formatting library acc could be String.
next
The trick- parameter that allows composing FunctionBuilders. Also note that FunctionBuilders are contravarient in this parameter; next is the output of the continuation acc -> next, hence this is an input from the perspective of the FunctionBuilder.
f_make_next
This is usually a function type that returns next, this is the type of the output function returned by toFunction.

A FunctionBuilder acc next f is a newtype wrapper around functions of type (acc -> next) -> f.

The immediate return value of the function is usually a function type, that takes zero or more arguments: a_0 -> .. -> a_N -> next.

The FunctionBuilders that addParameter returns are polymorphic in next. And next is the key for composition.

For example:

fb1 :: FunctionBuilder MyMonoid next (Int -> next)
fb1 = addParameter undefined

fb2 :: FunctionBuilder MyMonoid next (String -> next)
fb2 = addParameter undefined

newtype MyMonoid = MyMonoid () deriving (Semigroup, Monoid)

When we desugar with ghci:

>>> :t (runFunctionBuilder fb1)
(runFunctionBuilder fb1) :: (MyMonoid -> next) -> Int -> next
>>> :t (runFunctionBuilder fb2)
(runFunctionBuilder fb2) :: (MyMonoid -> next) -> String -> next

Composition comes in two flavours:

  1. By using . to add to the accumulator a value passed to an additional argument of the resulting output function (see example below).
  2. By using <> to append a fixed value to the accumulator directly.

When composing fb1 and fb2 using . we get:

>>> :t (fb1 . fb2)
(fb1 . fb2) :: FunctionBuilder MyMonoid a (Int -> String -> a)

And desugared:

>>> :t runFunctionBuilder (fb1 . fb2)
runFunctionBuilder (fb1 . fb2) :: (MyMonoid -> next) -> Int -> String -> next

What happened during composition was that the next in fb1 was used to insert into Int -> next the String -> other_next from fb2; such that this results in Int -> (String -> other_next). (Note: For clarity I renamed the type local type parameter next to other_next from fb2)

Constructors

FB 

Fields

Instances
Monoid m => Category (FunctionBuilder m :: Type -> Type -> Type)

Compose FunctionBuilders such that the output function first takes all parameters from the first FunctionBuilder and then all parameters from the second FunctionBuilder and then appends the results of both functions, which is why we need the Monoid constraint.

Instance details

Defined in Data.FunctionBuilder

Methods

id :: FunctionBuilder m a a #

(.) :: FunctionBuilder m b c -> FunctionBuilder m a b -> FunctionBuilder m a c #

Monad (FunctionBuilder m r) 
Instance details

Defined in Data.FunctionBuilder

Methods

(>>=) :: FunctionBuilder m r a -> (a -> FunctionBuilder m r b) -> FunctionBuilder m r b #

(>>) :: FunctionBuilder m r a -> FunctionBuilder m r b -> FunctionBuilder m r b #

return :: a -> FunctionBuilder m r a #

fail :: String -> FunctionBuilder m r a #

Functor (FunctionBuilder m r) 
Instance details

Defined in Data.FunctionBuilder

Methods

fmap :: (a -> b) -> FunctionBuilder m r a -> FunctionBuilder m r b #

(<$) :: a -> FunctionBuilder m r b -> FunctionBuilder m r a #

Applicative (FunctionBuilder m r) 
Instance details

Defined in Data.FunctionBuilder

Methods

pure :: a -> FunctionBuilder m r a #

(<*>) :: FunctionBuilder m r (a -> b) -> FunctionBuilder m r a -> FunctionBuilder m r b #

liftA2 :: (a -> b -> c) -> FunctionBuilder m r a -> FunctionBuilder m r b -> FunctionBuilder m r c #

(*>) :: FunctionBuilder m r a -> FunctionBuilder m r b -> FunctionBuilder m r b #

(<*) :: FunctionBuilder m r a -> FunctionBuilder m r b -> FunctionBuilder m r a #

Semigroup m => Semigroup (FunctionBuilder m r r)

Allow appending a FunctionBuilder to another without changing the resulting output function. For example, FunctionBuilders that have FunctionBuilder m r r can append something to m. It is not possible to add new parameters to the output function, this can only be done by the Category instance.

Instance details

Defined in Data.FunctionBuilder

Methods

(<>) :: FunctionBuilder m r r -> FunctionBuilder m r r -> FunctionBuilder m r r #

sconcat :: NonEmpty (FunctionBuilder m r r) -> FunctionBuilder m r r #

stimes :: Integral b => b -> FunctionBuilder m r r -> FunctionBuilder m r r #

Monoid m => Monoid (FunctionBuilder m r r)

Allow appending a FunctionBuilder to another without changing the resulting output function. For example, FunctionBuilders that have FunctionBuilder m r r can append something to m. It is not possible to add new parameters to the output function, this can only be done by the Category instance.

Instance details

Defined in Data.FunctionBuilder

newtype Tagged (s :: k) b :: forall k. k -> Type -> Type #

A Tagged s b value is a value b with an attached phantom type s. This can be used in place of the more traditional but less safe idiom of passing in an undefined value with the type, because unlike an (s -> b), a Tagged s b can't try to use the argument s as a real value.

Moreover, you don't have to rely on the compiler to inline away the extra argument, because the newtype is "free"

Tagged has kind k -> * -> * if the compiler supports PolyKinds, therefore there is an extra k showing in the instance haddocks that may cause confusion.

Constructors

Tagged 

Fields

Instances
Bitraversable (Tagged :: Type -> Type -> Type) 
Instance details

Defined in Data.Tagged

Methods

bitraverse :: Applicative f => (a -> f c) -> (b -> f d) -> Tagged a b -> f (Tagged c d) #

Bifoldable (Tagged :: Type -> Type -> Type) 
Instance details

Defined in Data.Tagged

Methods

bifold :: Monoid m => Tagged m m -> m #

bifoldMap :: Monoid m => (a -> m) -> (b -> m) -> Tagged a b -> m #

bifoldr :: (a -> c -> c) -> (b -> c -> c) -> c -> Tagged a b -> c #

bifoldl :: (c -> a -> c) -> (c -> b -> c) -> c -> Tagged a b -> c #

Bifunctor (Tagged :: Type -> Type -> Type) 
Instance details

Defined in Data.Tagged

Methods

bimap :: (a -> b) -> (c -> d) -> Tagged a c -> Tagged b d #

first :: (a -> b) -> Tagged a c -> Tagged b c #

second :: (b -> c) -> Tagged a b -> Tagged a c #

Eq2 (Tagged :: Type -> Type -> Type) 
Instance details

Defined in Data.Tagged

Methods

liftEq2 :: (a -> b -> Bool) -> (c -> d -> Bool) -> Tagged a c -> Tagged b d -> Bool #

Ord2 (Tagged :: Type -> Type -> Type) 
Instance details

Defined in Data.Tagged

Methods

liftCompare2 :: (a -> b -> Ordering) -> (c -> d -> Ordering) -> Tagged a c -> Tagged b d -> Ordering #

Read2 (Tagged :: Type -> Type -> Type) 
Instance details

Defined in Data.Tagged

Methods

liftReadsPrec2 :: (Int -> ReadS a) -> ReadS [a] -> (Int -> ReadS b) -> ReadS [b] -> Int -> ReadS (Tagged a b) #

liftReadList2 :: (Int -> ReadS a) -> ReadS [a] -> (Int -> ReadS b) -> ReadS [b] -> ReadS [Tagged a b] #

liftReadPrec2 :: ReadPrec a -> ReadPrec [a] -> ReadPrec b -> ReadPrec [b] -> ReadPrec (Tagged a b) #

liftReadListPrec2 :: ReadPrec a -> ReadPrec [a] -> ReadPrec b -> ReadPrec [b] -> ReadPrec [Tagged a b] #

Show2 (Tagged :: Type -> Type -> Type) 
Instance details

Defined in Data.Tagged

Methods

liftShowsPrec2 :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> (Int -> b -> ShowS) -> ([b] -> ShowS) -> Int -> Tagged a b -> ShowS #

liftShowList2 :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> (Int -> b -> ShowS) -> ([b] -> ShowS) -> [Tagged a b] -> ShowS #

Generic1 (Tagged s :: Type -> Type) 
Instance details

Defined in Data.Tagged

Associated Types

type Rep1 (Tagged s) :: k -> Type #

Methods

from1 :: Tagged s a -> Rep1 (Tagged s) a #

to1 :: Rep1 (Tagged s) a -> Tagged s a #

Monad (Tagged s) 
Instance details

Defined in Data.Tagged

Methods

(>>=) :: Tagged s a -> (a -> Tagged s b) -> Tagged s b #

(>>) :: Tagged s a -> Tagged s b -> Tagged s b #

return :: a -> Tagged s a #

fail :: String -> Tagged s a #

Functor (Tagged s) 
Instance details

Defined in Data.Tagged

Methods

fmap :: (a -> b) -> Tagged s a -> Tagged s b #

(<$) :: a -> Tagged s b -> Tagged s a #

Applicative (Tagged s) 
Instance details

Defined in Data.Tagged

Methods

pure :: a -> Tagged s a #

(<*>) :: Tagged s (a -> b) -> Tagged s a -> Tagged s b #

liftA2 :: (a -> b -> c) -> Tagged s a -> Tagged s b -> Tagged s c #

(*>) :: Tagged s a -> Tagged s b -> Tagged s b #

(<*) :: Tagged s a -> Tagged s b -> Tagged s a #

Foldable (Tagged s) 
Instance details

Defined in Data.Tagged

Methods

fold :: Monoid m => Tagged s m -> m #

foldMap :: Monoid m => (a -> m) -> Tagged s a -> m #

foldr :: (a -> b -> b) -> b -> Tagged s a -> b #

foldr' :: (a -> b -> b) -> b -> Tagged s a -> b #

foldl :: (b -> a -> b) -> b -> Tagged s a -> b #

foldl' :: (b -> a -> b) -> b -> Tagged s a -> b #

foldr1 :: (a -> a -> a) -> Tagged s a -> a #

foldl1 :: (a -> a -> a) -> Tagged s a -> a #

toList :: Tagged s a -> [a] #

null :: Tagged s a -> Bool #

length :: Tagged s a -> Int #

elem :: Eq a => a -> Tagged s a -> Bool #

maximum :: Ord a => Tagged s a -> a #

minimum :: Ord a => Tagged s a -> a #

sum :: Num a => Tagged s a -> a #

product :: Num a => Tagged s a -> a #

Traversable (Tagged s) 
Instance details

Defined in Data.Tagged

Methods

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

sequenceA :: Applicative f => Tagged s (f a) -> f (Tagged s a) #

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

sequence :: Monad m => Tagged s (m a) -> m (Tagged s a) #

Eq1 (Tagged s) 
Instance details

Defined in Data.Tagged

Methods

liftEq :: (a -> b -> Bool) -> Tagged s a -> Tagged s b -> Bool #

Ord1 (Tagged s) 
Instance details

Defined in Data.Tagged

Methods

liftCompare :: (a -> b -> Ordering) -> Tagged s a -> Tagged s b -> Ordering #

Read1 (Tagged s) 
Instance details

Defined in Data.Tagged

Methods

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

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

liftReadPrec :: ReadPrec a -> ReadPrec [a] -> ReadPrec (Tagged s a) #

liftReadListPrec :: ReadPrec a -> ReadPrec [a] -> ReadPrec [Tagged s a] #

Show1 (Tagged s) 
Instance details

Defined in Data.Tagged

Methods

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

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

Bounded b => Bounded (Tagged s b) 
Instance details

Defined in Data.Tagged

Methods

minBound :: Tagged s b #

maxBound :: Tagged s b #

Enum a => Enum (Tagged s a) 
Instance details

Defined in Data.Tagged

Methods

succ :: Tagged s a -> Tagged s a #

pred :: Tagged s a -> Tagged s a #

toEnum :: Int -> Tagged s a #

fromEnum :: Tagged s a -> Int #

enumFrom :: Tagged s a -> [Tagged s a] #

enumFromThen :: Tagged s a -> Tagged s a -> [Tagged s a] #

enumFromTo :: Tagged s a -> Tagged s a -> [Tagged s a] #

enumFromThenTo :: Tagged s a -> Tagged s a -> Tagged s a -> [Tagged s a] #

Eq b => Eq (Tagged s b) 
Instance details

Defined in Data.Tagged

Methods

(==) :: Tagged s b -> Tagged s b -> Bool #

(/=) :: Tagged s b -> Tagged s b -> Bool #

Floating a => Floating (Tagged s a) 
Instance details

Defined in Data.Tagged

Methods

pi :: Tagged s a #

exp :: Tagged s a -> Tagged s a #

log :: Tagged s a -> Tagged s a #

sqrt :: Tagged s a -> Tagged s a #

(**) :: Tagged s a -> Tagged s a -> Tagged s a #

logBase :: Tagged s a -> Tagged s a -> Tagged s a #

sin :: Tagged s a -> Tagged s a #

cos :: Tagged s a -> Tagged s a #

tan :: Tagged s a -> Tagged s a #

asin :: Tagged s a -> Tagged s a #

acos :: Tagged s a -> Tagged s a #

atan :: Tagged s a -> Tagged s a #

sinh :: Tagged s a -> Tagged s a #

cosh :: Tagged s a -> Tagged s a #

tanh :: Tagged s a -> Tagged s a #

asinh :: Tagged s a -> Tagged s a #

acosh :: Tagged s a -> Tagged s a #

atanh :: Tagged s a -> Tagged s a #

log1p :: Tagged s a -> Tagged s a #

expm1 :: Tagged s a -> Tagged s a #

log1pexp :: Tagged s a -> Tagged s a #

log1mexp :: Tagged s a -> Tagged s a #

Fractional a => Fractional (Tagged s a) 
Instance details

Defined in Data.Tagged

Methods

(/) :: Tagged s a -> Tagged s a -> Tagged s a #

recip :: Tagged s a -> Tagged s a #

fromRational :: Rational -> Tagged s a #

Integral a => Integral (Tagged s a) 
Instance details

Defined in Data.Tagged

Methods

quot :: Tagged s a -> Tagged s a -> Tagged s a #

rem :: Tagged s a -> Tagged s a -> Tagged s a #

div :: Tagged s a -> Tagged s a -> Tagged s a #

mod :: Tagged s a -> Tagged s a -> Tagged s a #

quotRem :: Tagged s a -> Tagged s a -> (Tagged s a, Tagged s a) #

divMod :: Tagged s a -> Tagged s a -> (Tagged s a, Tagged s a) #

toInteger :: Tagged s a -> Integer #

(Data s, Data b) => Data (Tagged s b) 
Instance details

Defined in Data.Tagged

Methods

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

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

toConstr :: Tagged s b -> Constr #

dataTypeOf :: Tagged s b -> DataType #

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

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

gmapT :: (forall b0. Data b0 => b0 -> b0) -> Tagged s b -> Tagged s b #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Tagged s b -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Tagged s b -> r #

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

gmapQi :: Int -> (forall d. Data d => d -> u) -> Tagged s b -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Tagged s b -> m (Tagged s b) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Tagged s b -> m (Tagged s b) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Tagged s b -> m (Tagged s b) #

Num a => Num (Tagged s a) 
Instance details

Defined in Data.Tagged

Methods

(+) :: Tagged s a -> Tagged s a -> Tagged s a #

(-) :: Tagged s a -> Tagged s a -> Tagged s a #

(*) :: Tagged s a -> Tagged s a -> Tagged s a #

negate :: Tagged s a -> Tagged s a #

abs :: Tagged s a -> Tagged s a #

signum :: Tagged s a -> Tagged s a #

fromInteger :: Integer -> Tagged s a #

Ord b => Ord (Tagged s b) 
Instance details

Defined in Data.Tagged

Methods

compare :: Tagged s b -> Tagged s b -> Ordering #

(<) :: Tagged s b -> Tagged s b -> Bool #

(<=) :: Tagged s b -> Tagged s b -> Bool #

(>) :: Tagged s b -> Tagged s b -> Bool #

(>=) :: Tagged s b -> Tagged s b -> Bool #

max :: Tagged s b -> Tagged s b -> Tagged s b #

min :: Tagged s b -> Tagged s b -> Tagged s b #

Read b => Read (Tagged s b) 
Instance details

Defined in Data.Tagged

Real a => Real (Tagged s a) 
Instance details

Defined in Data.Tagged

Methods

toRational :: Tagged s a -> Rational #

RealFloat a => RealFloat (Tagged s a) 
Instance details

Defined in Data.Tagged

Methods

floatRadix :: Tagged s a -> Integer #

floatDigits :: Tagged s a -> Int #

floatRange :: Tagged s a -> (Int, Int) #

decodeFloat :: Tagged s a -> (Integer, Int) #

encodeFloat :: Integer -> Int -> Tagged s a #

exponent :: Tagged s a -> Int #

significand :: Tagged s a -> Tagged s a #

scaleFloat :: Int -> Tagged s a -> Tagged s a #

isNaN :: Tagged s a -> Bool #

isInfinite :: Tagged s a -> Bool #

isDenormalized :: Tagged s a -> Bool #

isNegativeZero :: Tagged s a -> Bool #

isIEEE :: Tagged s a -> Bool #

atan2 :: Tagged s a -> Tagged s a -> Tagged s a #

RealFrac a => RealFrac (Tagged s a) 
Instance details

Defined in Data.Tagged

Methods

properFraction :: Integral b => Tagged s a -> (b, Tagged s a) #

truncate :: Integral b => Tagged s a -> b #

round :: Integral b => Tagged s a -> b #

ceiling :: Integral b => Tagged s a -> b #

floor :: Integral b => Tagged s a -> b #

Show b => Show (Tagged s b) 
Instance details

Defined in Data.Tagged

Methods

showsPrec :: Int -> Tagged s b -> ShowS #

show :: Tagged s b -> String #

showList :: [Tagged s b] -> ShowS #

Ix b => Ix (Tagged s b) 
Instance details

Defined in Data.Tagged

Methods

range :: (Tagged s b, Tagged s b) -> [Tagged s b] #

index :: (Tagged s b, Tagged s b) -> Tagged s b -> Int #

unsafeIndex :: (Tagged s b, Tagged s b) -> Tagged s b -> Int

inRange :: (Tagged s b, Tagged s b) -> Tagged s b -> Bool #

rangeSize :: (Tagged s b, Tagged s b) -> Int #

unsafeRangeSize :: (Tagged s b, Tagged s b) -> Int

IsString a => IsString (Tagged s a) 
Instance details

Defined in Data.Tagged

Methods

fromString :: String -> Tagged s a #

Generic (Tagged s b) 
Instance details

Defined in Data.Tagged

Associated Types

type Rep (Tagged s b) :: Type -> Type #

Methods

from :: Tagged s b -> Rep (Tagged s b) x #

to :: Rep (Tagged s b) x -> Tagged s b #

Semigroup a => Semigroup (Tagged s a) 
Instance details

Defined in Data.Tagged

Methods

(<>) :: Tagged s a -> Tagged s a -> Tagged s a #

sconcat :: NonEmpty (Tagged s a) -> Tagged s a #

stimes :: Integral b => b -> Tagged s a -> Tagged s a #

(Semigroup a, Monoid a) => Monoid (Tagged s a) 
Instance details

Defined in Data.Tagged

Methods

mempty :: Tagged s a #

mappend :: Tagged s a -> Tagged s a -> Tagged s a #

mconcat :: [Tagged s a] -> Tagged s a #

Storable a => Storable (Tagged s a) 
Instance details

Defined in Data.Tagged

Methods

sizeOf :: Tagged s a -> Int #

alignment :: Tagged s a -> Int #

peekElemOff :: Ptr (Tagged s a) -> Int -> IO (Tagged s a) #

pokeElemOff :: Ptr (Tagged s a) -> Int -> Tagged s a -> IO () #

peekByteOff :: Ptr b -> Int -> IO (Tagged s a) #

pokeByteOff :: Ptr b -> Int -> Tagged s a -> IO () #

peek :: Ptr (Tagged s a) -> IO (Tagged s a) #

poke :: Ptr (Tagged s a) -> Tagged s a -> IO () #

Bits a => Bits (Tagged s a) 
Instance details

Defined in Data.Tagged

Methods

(.&.) :: Tagged s a -> Tagged s a -> Tagged s a #

(.|.) :: Tagged s a -> Tagged s a -> Tagged s a #

xor :: Tagged s a -> Tagged s a -> Tagged s a #

complement :: Tagged s a -> Tagged s a #

shift :: Tagged s a -> Int -> Tagged s a #

rotate :: Tagged s a -> Int -> Tagged s a #

zeroBits :: Tagged s a #

bit :: Int -> Tagged s a #

setBit :: Tagged s a -> Int -> Tagged s a #

clearBit :: Tagged s a -> Int -> Tagged s a #

complementBit :: Tagged s a -> Int -> Tagged s a #

testBit :: Tagged s a -> Int -> Bool #

bitSizeMaybe :: Tagged s a -> Maybe Int #

bitSize :: Tagged s a -> Int #

isSigned :: Tagged s a -> Bool #

shiftL :: Tagged s a -> Int -> Tagged s a #

unsafeShiftL :: Tagged s a -> Int -> Tagged s a #

shiftR :: Tagged s a -> Int -> Tagged s a #

unsafeShiftR :: Tagged s a -> Int -> Tagged s a #

rotateL :: Tagged s a -> Int -> Tagged s a #

rotateR :: Tagged s a -> Int -> Tagged s a #

popCount :: Tagged s a -> Int #

FiniteBits a => FiniteBits (Tagged s a) 
Instance details

Defined in Data.Tagged

Default c => Default (Tagged s c) Source # 
Instance details

Defined in Data.ByteString.IsoBaseFileFormat.ReExports

Methods

def :: Tagged s c #

NFData b => NFData (Tagged s b) 
Instance details

Defined in Data.Tagged

Methods

rnf :: Tagged s b -> () #

IsBoxContent c => IsBoxContent (Tagged s c) Source # 
Instance details

Defined in Data.ByteString.IsoBaseFileFormat.Box

type Rep1 (Tagged s :: Type -> Type) 
Instance details

Defined in Data.Tagged

type Rep1 (Tagged s :: Type -> Type) = D1 (MetaData "Tagged" "Data.Tagged" "tagged-0.8.6-FABECvKnqYbBCttH1EeJvB" True) (C1 (MetaCons "Tagged" PrefixI True) (S1 (MetaSel (Just "unTagged") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1))
type ToPretty (Tagged s b :: Type)

Pretty print a Tagged value.

Since: pretty-types-0.2.2.0

Instance details

Defined in Data.Type.Pretty

type Rep (Tagged s b) 
Instance details

Defined in Data.Tagged

type Rep (Tagged s b) = D1 (MetaData "Tagged" "Data.Tagged" "tagged-0.8.6-FABECvKnqYbBCttH1EeJvB" True) (C1 (MetaCons "Tagged" PrefixI True) (S1 (MetaSel (Just "unTagged") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 b)))

writeIndented :: String -> PTM () #

Internal; write a possibly indented string, and update the PTRenderState accordingly.

Since: pretty-types-0.2.0.0

showPretty #

Arguments

:: PrettyTypeShow (ToPretty t) 
=> proxy t

A proxy to the type to print. A ToPretty instance for t must exists.

-> String 

Pretty print either types of kind PrettyType or any other type with a ToPretty instance.

type family ToPretty (a :: k) :: PrettyType #

Create a PrettyType from a type.

This is a type-level equivalent of the Show class.

Write an instance of this for converting your type (preferrable of your kind also) to a promoted PrettyType.

Instances
type ToPretty False

Render False as PutStr "'False"

Since: pretty-types-0.2.1.0

Instance details

Defined in Data.Type.Pretty

type ToPretty False = PutStr "'False"
type ToPretty True

Render True as PutStr "'True"

Since: pretty-types-0.2.1.0

Instance details

Defined in Data.Type.Pretty

type ToPretty True = PutStr "'True"
type ToPretty (t :: Nat)

A type of kind Nat is translated to PutNat.

Since: pretty-types-0.2.1.0

Instance details

Defined in Data.Type.Pretty

type ToPretty (t :: Nat) = PutNat t
type ToPretty (t :: Symbol)

A type of kind Symbol is translated to PutStr.

Since: pretty-types-0.2.1.0

Instance details

Defined in Data.Type.Pretty

type ToPretty (t :: Symbol) = PutStr t
type ToPretty (t :: PrettyType)

A type of kind PrettyType has a trivial id-likeToPretty instance.

Instance details

Defined in Data.Type.Pretty

type ToPretty (t :: PrettyType) = t
type ToPretty (rec :: BitRecord) Source # 
Instance details

Defined in Data.Type.BitRecords.Core

type ToPretty (rec :: BitRecord) = PrettyRecord rec
type ToPretty (t :: Maybe x)

Render a type of kind Maybe.

Since: pretty-types-0.2.1.0

Instance details

Defined in Data.Type.Pretty

type ToPretty (t :: Maybe x) = ToPrettyMaybe t
type ToPretty Bool

Render Bool as PutStr Bool

Since: pretty-types-0.2.1.0

Instance details

Defined in Data.Type.Pretty

type ToPretty Bool = PutStr "Bool"
type ToPretty Double

Render Double as PutStr Double

Since: pretty-types-0.2.1.0

Instance details

Defined in Data.Type.Pretty

type ToPretty Double = PutStr "Double"
type ToPretty Float

Render Float as PutStr Float

Since: pretty-types-0.2.1.0

Instance details

Defined in Data.Type.Pretty

type ToPretty Float = PutStr "Float"
type ToPretty Int

Render Int as PutStr Int

Since: pretty-types-0.2.1.0

Instance details

Defined in Data.Type.Pretty

type ToPretty Int = PutStr "Int"
type ToPretty Int8

Render Int8 as PutStr Int8

Since: pretty-types-0.2.1.0

Instance details

Defined in Data.Type.Pretty

type ToPretty Int8 = PutStr "Int8"
type ToPretty Int16

Render Int16 as PutStr Int16

Since: pretty-types-0.2.1.0

Instance details

Defined in Data.Type.Pretty

type ToPretty Int16 = PutStr "Int16"
type ToPretty Int32

Render Int32 as PutStr Int32

Since: pretty-types-0.2.1.0

Instance details

Defined in Data.Type.Pretty

type ToPretty Int32 = PutStr "Int32"
type ToPretty Int64

Render Int64 as PutStr Int64

Since: pretty-types-0.2.1.0

Instance details

Defined in Data.Type.Pretty

type ToPretty Int64 = PutStr "Int64"
type ToPretty Integer

Render Integer as PutStr Integer

Since: pretty-types-0.2.1.0

Instance details

Defined in Data.Type.Pretty

type ToPretty Integer = PutStr "Integer"
type ToPretty Word8

Render Word8 as PutStr Word8

Since: pretty-types-0.2.1.0

Instance details

Defined in Data.Type.Pretty

type ToPretty Word8 = PutStr "Word8"
type ToPretty Word16

Render Word16 as PutStr Word16

Since: pretty-types-0.2.1.0

Instance details

Defined in Data.Type.Pretty

type ToPretty Word16 = PutStr "Word16"
type ToPretty Word32

Render Word32 as PutStr Word32

Since: pretty-types-0.2.1.0

Instance details

Defined in Data.Type.Pretty

type ToPretty Word32 = PutStr "Word32"
type ToPretty Word64

Render Word64 as PutStr Word64

Since: pretty-types-0.2.1.0

Instance details

Defined in Data.Type.Pretty

type ToPretty Word64 = PutStr "Word64"
type ToPretty ASizedString Source # 
Instance details

Defined in Data.Type.BitRecords.SizedString

type ToPretty (EnumValue e :: Type) Source # 
Instance details

Defined in Data.Type.BitRecords.Enum

type ToPretty (EnumValue e :: Type) = PutStr "<<enum>>"
type ToPretty (Tagged s b :: Type)

Pretty print a Tagged value.

Since: pretty-types-0.2.2.0

Instance details

Defined in Data.Type.Pretty

type ToPretty (f :: IsA (BitRecordField t)) Source # 
Instance details

Defined in Data.Type.BitRecords.Core

type family ToPrettyMaybe (t :: Maybe x) :: PrettyType where ... #

Render a type of kind Maybe.

Since: pretty-types-0.2.1.0

type PutStrW (width :: Nat) (str :: Symbol) = PrettySymbol (PrettyPadded width) (PrettyPrecision width) str #

A PrettyType for a string with the exact given width.

type PutStrLn (str :: Symbol) = PutStr str <++> PutStr "\n" #

A PrettyType for a string with a newline character at the end.

type PutNatW (width :: Nat) (x :: Nat) = PrettyNat (PrettyPadded width) PrettyPrecise PrettyDec x #

A PrettyType for a number with a width.

type PutHex (x :: Nat) = PrettyNat PrettyUnpadded PrettyPrecise PrettyHex x #

Create PrettyType from a Nat formatted as hex number using lower-case letters for the hex digits.

type PutHex8 (x :: Nat) = PrettyNat PrettyUnpadded (PrettyPrecision 2) PrettyHex x #

Create PrettyType from a Nat formatted as 8 bit hex number using lower-case letters for the hex digits.

type PutHex16 (x :: Nat) = PrettyNat PrettyUnpadded (PrettyPrecision 4) PrettyHex x #

Create PrettyType from a Nat formatted as 16 bit hex number using lower-case letters for the hex digits.

type PutHex32 (x :: Nat) = PrettyNat PrettyUnpadded (PrettyPrecision 8) PrettyHex x #

Create PrettyType from a Nat formatted as 32 bit hex number using lower-case letters for the hex digits.

type PutHex64 (x :: Nat) = PrettyNat PrettyUnpadded (PrettyPrecision 16) PrettyHex x #

Create PrettyType from a Nat formatted as 64 bit hex number using lower-case letters for the hex digits.

type PutHeX (x :: Nat) = PrettyNat PrettyUnpadded PrettyPrecise PrettyHexU x #

Create PrettyType from a Nat formatted as hex number using lower-case letters for the hex digits.

type PutHeX8 (x :: Nat) = PrettyNat PrettyUnpadded (PrettyPrecision 2) PrettyHexU x #

Create PrettyType from a Nat formatted as 8 bit hex number using uppercase letters for the hex digits.

type PutHeX16 (x :: Nat) = PrettyNat PrettyUnpadded (PrettyPrecision 4) PrettyHexU x #

Create PrettyType from a Nat formatted as 16 bit hex number using uppercase letters for the hex digits.

type PutHeX32 (x :: Nat) = PrettyNat PrettyUnpadded (PrettyPrecision 8) PrettyHexU x #

Create PrettyType from a Nat formatted as 32 bit hex number using uppercase letters for the hex digits.

type PutHeX64 (x :: Nat) = PrettyNat PrettyUnpadded (PrettyPrecision 16) PrettyHexU x #

Create PrettyType from a Nat formatted as 64 bit hex number using uppercase letters for the hex digits.

type PutBits (x :: Nat) = PrettyNat PrettyUnpadded PrettyPrecise PrettyBit x #

Create PrettyType from a Nat formatted as bit representation,

>>> showPretty (Proxy :: Proxy (PutBits 5))
"101"

type PutBits8 (x :: Nat) = PrettyNat PrettyUnpadded (PrettyPrecision 8) PrettyBit x #

Create PrettyType from a Nat formatted as 8-bit bit representation,

>>> showPretty (Proxy :: Proxy (PutBits8 5))
"00000101"

type PutBits16 (x :: Nat) = PrettyNat PrettyUnpadded (PrettyPrecision 16) PrettyBit x #

Create PrettyType from a Nat formatted as 16-bit bit representation,

>>> showPretty (Proxy :: Proxy (PutBits16 5))
"00000000000000101"

type PutBits32 (x :: Nat) = PrettyNat PrettyUnpadded (PrettyPrecision 32) PrettyBit x #

Create PrettyType from a Nat formatted as 32-bit bit representation,

>>> showPretty (Proxy :: Proxy (PutBits32 5))
"00000000000000000000000000000000101"

type PutBits64 (x :: Nat) = PrettyNat PrettyUnpadded (PrettyPrecision 64) PrettyBit x #

Create PrettyType from a Nat formatted as 64-bit bit representation,

>>> showPretty (Proxy :: Proxy (PutBits64 5))
"00000000000000000000000000000000000000000000000000000000000000000000101"

type (<:>) (label :: Symbol) (body :: PrettyType) = PrettySuffix (PutStr ":") (PutStr label) <+> body infixl 5 #

A label followed by a colon and space : followed by another element.

>>> showPretty (Proxy :: Proxy ("foo" <:> PutStr "bar"))
@
foo: bar
@

Since: pretty-types-0.2.0.0

type (<:$$>) (label :: Symbol) (body :: PrettyType) = PrettySuffix (PutStr ":") (PutStr label) <$$> body infixl 5 #

Like <:> but begin the body on a new line.

>>> showPretty (Proxy :: Proxy (PutStr "foo" <:$$> PutStr "bar"))
@
foo:
bar
@

Since: pretty-types-0.2.0.0

type (<:$$-->) (label :: Symbol) (body :: PrettyType) = PrettySuffix (PutStr ":") (PutStr label) <$$--> body infixl 3 #

Like '<:$$__>' but indent the body with two spaces.

>>> showPretty (Proxy :: Proxy (PutStr "foo" <:$$--> PutStr "bar"))
@
foo:
  bar
@

Since: pretty-types-0.2.0.0

type (<++>) (l :: PrettyType) (r :: PrettyType) = PrettyInfix PrettyEmpty l r infixl 6 #

Concatenate two PrettyType.

type (<+>) (l :: PrettyType) (r :: PrettyType) = PrettyInfix PrettySpace l r infixl 5 #

Concatenate two PrettyType using a PrettySpace.

type (<||>) (l :: PrettyType) (r :: PrettyType) = PrettyAlternative l r infixl 5 #

Choose the first non-empty from two PrettyTypes.

Since: pretty-types-0.2.0.0

type (<$$>) (l :: PrettyType) (r :: PrettyType) = PrettyInfix PrettyNewline l r infixl 4 #

Concatenate two PrettyType using a PrettyNewline.

type (<$$-->) (l :: PrettyType) (r :: PrettyType) = PrettyInfix PrettyNewline l (PrettyIndent 2 r) infixl 3 #

Concatenate two PrettyType using a PrettyNewline and indent the second.

Since: pretty-types-0.2.0.0

type PrettyParens (doc :: PrettyType) = PrettySurrounded (PutStr "(") (PutStr ")") doc #

Surround a pretty with parens

type PrettySurrounded (open :: PrettyType) (close :: PrettyType) (doc :: PrettyType) = (open <++> doc) <++> close #

Surround a pretty with some pretties

type PrettyWide (docs :: [PrettyType]) = PrettyMany PrettySpace docs #

Combine a (type level) list of PrettyTypes next to each other using PrettySpace

type PrettyHigh (docs :: [PrettyType]) = PrettyMany PrettyNewline docs #

Combine a (type level) list of PrettyTypes below each other using PrettyNewline

type PrettyManyIn (sep :: PrettyType) (docs :: [PrettyType]) = PrettySurrounded sep sep (PrettyMany sep docs) #

A combination of PrettySpace and PrettyMany, e.g.:

>>> showPretty (Proxy :: Proxy (PrettyManyIn (PutStr "|") '[PutStr "a", PutStr "b"]))
"|a|b|"

type family PrettyMany (sep :: PrettyType) (docs :: [PrettyType]) :: PrettyType where ... #

Combine a (type level) list of PrettyTypes seperated by a seperation element.

Equations

PrettyMany sep ([] :: [PrettyType]) = PrettyEmpty 
PrettyMany sep (singleOne ': ([] :: [PrettyType])) = singleOne 
PrettyMany sep (next ': rest) = (next <++> sep) <++> PrettyMany sep rest 

type family PrettyOften (n :: Nat) (doc :: PrettyType) :: PrettyType where ... #

Repeat a PrettyType n-times and append the copies.

Equations

PrettyOften 0 doc = PrettyEmpty 
PrettyOften n doc = doc <++> PrettyOften (n - 1) doc 

data PrettyType #

Combinators for type documents.

The basis for pretty printing is this eDSL. It is rendered via the PrettyTypeShow instances for its promoted constructors.

Only the promoted constructors are used, only they have instances for that class.

Constructors

PrettyEmpty 
PrettySpace 
PrettyNewline

Begin a newline. Always use this otherwise indentation will not work!

PrettySymbol PrettyPadded PrettyPrecision Symbol 
PrettyNat PrettyPadded PrettyPrecision PrettyNatFormat Nat 
PrettyPrefix PrettyType PrettyType

Prefix the second with the first argument, but only if it (the second) has content.

Since: pretty-types-0.2.0.0

PrettyInfix PrettyType PrettyType PrettyType

Combine the last to arguments with the first in between them, but only if both have content.

PrettySuffix PrettyType PrettyType

Add a the first argument as suffix to the second argument, but only if the second has content.

Since: pretty-types-0.2.0.0

PrettyIndent Nat PrettyType

Indentation. Prefix any line using the given number of PrettySpace.

Since: pretty-types-0.2.0.0

PrettyAlternative PrettyType PrettyType

Alternative rendering, if the first document ist empty the second will be rendered.

Since: pretty-types-0.2.0.0

Instances
type ToPretty (t :: PrettyType)

A type of kind PrettyType has a trivial id-likeToPretty instance.

Instance details

Defined in Data.Type.Pretty

type ToPretty (t :: PrettyType) = t

data PrettyPadded #

Constructors

PrettyUnpadded

No minimum or fixed width

PrettyPadded Nat

Pad a PrettySymbol or PrettyNat with spaces or zeros. NOTE PrettyNats will never be shorter than the minimum number of digits, regardless of this padding.

Instances
PrintfArgModifier PrettyUnpadded

Translation of PrettyUnpadded to an empty modifier string

Instance details

Defined in Data.Type.Pretty

KnownNat p => PrintfArgModifier (PrettyPadded p :: PrettyPadded)

Translation of PrettyPadded to a string with the numeric padding value.

Instance details

Defined in Data.Type.Pretty

data PrettyPrecision #

The precision for PrettySymbol and PrettyNat.

Constructors

PrettyPrecise

No minimum precision.

PrettyPrecision Nat

Precision, for Symbols the maximum width, for Nats the minimum digits. NOTEPrettyNats will never be shorter than the minimum number of digits, wheres PrettySymbols will be truncated if they are longer than the precision.

Instances
PrintfArgModifier PrettyPrecise

Translation of PrettyPrecise to an empty modifier string

Instance details

Defined in Data.Type.Pretty

KnownNat p => PrintfArgModifier (PrettyPrecision p :: PrettyPrecision)

Translation of PrettyPadded to a string with the numeric precision value, prependen by a dot ".".

Instance details

Defined in Data.Type.Pretty

data PrettyNatFormat #

PrettyNat formatting options.

Constructors

PrettyHex

Hexa decimal rendering:

>>> showPretty (Proxy::Proxy (PrettyNat PrettyUnpadded PrettyPrecise PrettyHex 51966))
"cafe"
PrettyHexU

Hexa decimal rendering (upper case):

>>> showPretty (Proxy::Proxy (PrettyNat PrettyUnpadded PrettyPrecise PrettyHexU 51966))
"CAFE"
PrettyDec

Decimal rendering:

>>> showPretty (Proxy::Proxy (PrettyNat PrettyUnpadded PrettyPrecise PrettyHexU 51966))
"51966"
PrettyBit

Binary rendering:

>>> showPretty (Proxy::Proxy (PrettyNat PrettyUnpadded PrettyPrecise PrettyHexU 51966))
"1100101011111110"
Instances
PrintfArgModifier PrettyBit

Translation of PrettyBit to printf format character: b

Instance details

Defined in Data.Type.Pretty

PrintfArgModifier PrettyDec

Translation of PrettyDec to printf format character: d

Instance details

Defined in Data.Type.Pretty

PrintfArgModifier PrettyHexU

Translation of PrettyHexU to printf format character: X

Instance details

Defined in Data.Type.Pretty

PrintfArgModifier PrettyHex

Translation of PrettyHex to printf format character: x

Instance details

Defined in Data.Type.Pretty

type Prettifies t = Prettifier t -> Type #

Kind of Prettifier data types.

The type that all data types share, such that they can be passed to PrettifyWith.

Sometimes it is desirable to pass around pretty-printing functions called Prettifier in this library. A Prettifier is a parameterized pretty-printer that accepts a parameter of a specific kind.

For example:

data PutStrIsh :: Prettifies Symbol

type instance PrettifyWith PutStrIsh str = PutStr str ++ PutStr "ish"
>>> showPretty (Proxy @(PrettifyWith PutStrIsh "That's pretty okay"))
"That's pretty okayish"

Since: pretty-types-0.2.3.0

data Prettifier a #

An abstract declaration of a pretty-printing (type-)function that takes a specific kind of types as parameter.

Since: pretty-types-0.2.3.0

type family PrettifyWith (f :: Prettifies k) (x :: k) :: PrettyType #

Apply a Prettifier to a type in order to get a PrettyType

Since: pretty-types-0.2.3.0

Instances
type PrettifyWith (PrettyTitled title indentation :: Prettifier k -> Type) (body :: k) 
Instance details

Defined in Data.Type.Pretty

type PrettifyWith (PrettyTitled title indentation :: Prettifier k -> Type) (body :: k) = PrettyInfix PrettyNewline title (PrettyIndent indentation (ToPretty body))

data PrettyTitled (title :: PrettyType) (indentation :: Nat) (a :: Prettifier t) :: forall t. PrettyType -> Nat -> Prettifier t -> Type #

Write a title and print the indented, ToPretty-fied body starting on the next line.

Since: pretty-types-0.2.3.0

Instances
type PrettifyWith (PrettyTitled title indentation :: Prettifier k -> Type) (body :: k) 
Instance details

Defined in Data.Type.Pretty

type PrettifyWith (PrettyTitled title indentation :: Prettifier k -> Type) (body :: k) = PrettyInfix PrettyNewline title (PrettyIndent indentation (ToPretty body))

class PrettyTypeShow (p :: PrettyType) where #

An internal type class for rendering the types of kind PrettyType.

Minimal complete definition

ptShow

Methods

ptShow :: proxy p -> PTM () #

Given any proxy to a promoted constructor of PrettyType, generate a String.

ptHasContent :: proxy p -> PTM Bool #

Return True if contents would be writting to the output of rendered via ptShow

Since: pretty-types-0.2.0.0

Instances
PrettyTypeShow PrettyNewline

Print a single newline character.

Instance details

Defined in Data.Type.Pretty

Methods

ptShow :: proxy PrettyNewline -> PTM () #

ptHasContent :: proxy PrettyNewline -> PTM Bool #

PrettyTypeShow PrettySpace

Print a single space character.

Instance details

Defined in Data.Type.Pretty

Methods

ptShow :: proxy PrettySpace -> PTM () #

ptHasContent :: proxy PrettySpace -> PTM Bool #

PrettyTypeShow PrettyEmpty

Print nothing.

Instance details

Defined in Data.Type.Pretty

Methods

ptShow :: proxy PrettyEmpty -> PTM () #

ptHasContent :: proxy PrettyEmpty -> PTM Bool #

(PrettyTypeShow l, PrettyTypeShow r) => PrettyTypeShow (PrettyAlternative l r)

Render the first document, and if it is empty, the second

Since: pretty-types-0.2.0.0

Instance details

Defined in Data.Type.Pretty

Methods

ptShow :: proxy (PrettyAlternative l r) -> PTM () #

ptHasContent :: proxy (PrettyAlternative l r) -> PTM Bool #

(PrettyTypeShow r, KnownNat n) => PrettyTypeShow (PrettyIndent n r)

Render an indented, nested type.

Since: pretty-types-0.2.0.0

Instance details

Defined in Data.Type.Pretty

Methods

ptShow :: proxy (PrettyIndent n r) -> PTM () #

ptHasContent :: proxy (PrettyIndent n r) -> PTM Bool #

(PrettyTypeShow sep, PrettyTypeShow x) => PrettyTypeShow (PrettySuffix sep x)

Add a PrettyType suffix to x, but only if ptHasContent holds.

Since: pretty-types-0.2.0.0

Instance details

Defined in Data.Type.Pretty

Methods

ptShow :: proxy (PrettySuffix sep x) -> PTM () #

ptHasContent :: proxy (PrettySuffix sep x) -> PTM Bool #

(PrettyTypeShow sep, PrettyTypeShow x) => PrettyTypeShow (PrettyPrefix sep x)

Prefix a PrettyType to x, but only if ptHasContent of x holds.

Instance details

Defined in Data.Type.Pretty

Methods

ptShow :: proxy (PrettyPrefix sep x) -> PTM () #

ptHasContent :: proxy (PrettyPrefix sep x) -> PTM Bool #

(PrettyTypeShow sep, PrettyTypeShow l, PrettyTypeShow r) => PrettyTypeShow (PrettyInfix sep l r)

Concatenate two PrettyTypes. If one of them is empty print the other without any seperation character.

Instance details

Defined in Data.Type.Pretty

Methods

ptShow :: proxy (PrettyInfix sep l r) -> PTM () #

ptHasContent :: proxy (PrettyInfix sep l r) -> PTM Bool #

(KnownSymbol t, PrintfArgModifier pad, PrintfArgModifier prec) => PrettyTypeShow (PrettySymbol pad prec t)

Print a Symbol using the printf and the given format parameters.

Instance details

Defined in Data.Type.Pretty

Methods

ptShow :: proxy (PrettySymbol pad prec t) -> PTM () #

ptHasContent :: proxy (PrettySymbol pad prec t) -> PTM Bool #

(KnownNat x, PrintfArgModifier fmt, PrintfArgModifier pad, PrintfArgModifier prec) => PrettyTypeShow (PrettyNat pad prec fmt x)

Print a Nat using the printf and the given format parameters.

Instance details

Defined in Data.Type.Pretty

Methods

ptShow :: proxy (PrettyNat pad prec fmt x) -> PTM () #

ptHasContent :: proxy (PrettyNat pad prec fmt x) -> PTM Bool #

type PTM a = RWS Indentation String PTRenderState a #

The monad used by ptShow to keep track of indentation.

Since: pretty-types-0.2.0.0

type Indentation = Int #

Internal type of the indentation used by ptShow in PTM

Since: pretty-types-0.2.0.0

data PTRenderState #

Internal state used by ptShow in PTM

Since: pretty-types-0.2.0.0

class PrintfArgModifier (a :: k) where #

Internal printf format generation. Used internally by PrettyTypeShow instances to generate the format string piece by piece with the values for the instances of e.g. PrettyPrecise, PrettyNatFormat, or PrettyEmpty.

Methods

toPrintfArgModifier :: p a -> String #

Generate a piece of a printf format string from a proxy for a type.

Instances
PrintfArgModifier PrettyUnpadded

Translation of PrettyUnpadded to an empty modifier string

Instance details

Defined in Data.Type.Pretty

PrintfArgModifier PrettyPrecise

Translation of PrettyPrecise to an empty modifier string

Instance details

Defined in Data.Type.Pretty

PrintfArgModifier PrettyBit

Translation of PrettyBit to printf format character: b

Instance details

Defined in Data.Type.Pretty

PrintfArgModifier PrettyDec

Translation of PrettyDec to printf format character: d

Instance details

Defined in Data.Type.Pretty

PrintfArgModifier PrettyHexU

Translation of PrettyHexU to printf format character: X

Instance details

Defined in Data.Type.Pretty

PrintfArgModifier PrettyHex

Translation of PrettyHex to printf format character: x

Instance details

Defined in Data.Type.Pretty

KnownNat p => PrintfArgModifier (PrettyPadded p :: PrettyPadded)

Translation of PrettyPadded to a string with the numeric padding value.

Instance details

Defined in Data.Type.Pretty

KnownNat p => PrintfArgModifier (PrettyPrecision p :: PrettyPrecision)

Translation of PrettyPadded to a string with the numeric precision value, prependen by a dot ".".

Instance details

Defined in Data.Type.Pretty

reproxy :: proxy a -> Proxy b #

Some times you need to change the proxy you have lying around. Idiomatic usage is to make a new combinator for the relationship between the proxies that you want to enforce, and define that combinator using reproxy.

data Succ n
reproxySucc :: proxy n -> Proxy (Succ n)
reproxySucc = reproxy

tagWith :: proxy s -> a -> Tagged s a #

Another way to convert a proxy to a tag.

unproxy :: (Proxy s -> a) -> Tagged s a #

Convert from a representation based on a Proxy to a Tagged representation.

proxy :: Tagged s a -> proxy s -> a #

Convert from a Tagged representation to a representation based on a Proxy.

untagSelf :: Tagged a a -> a #

untagSelf is a type-restricted version of untag.

witness :: Tagged a b -> a -> b #

asTaggedTypeOf :: s -> tagged s b -> s #

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

tagSelf :: a -> Tagged a a #

Tag a value with its own type.

untag :: Tagged s b -> b #

Alias for unTagged

retag :: Tagged s b -> Tagged t b #

Some times you need to change the tag you have lying around. Idiomatic usage is to make a new combinator for the relationship between the tags that you want to enforce, and define that combinator using retag.

data Succ n
retagSucc :: Tagged n a -> Tagged (Succ n) a
retagSucc = retag

type (--*) (title :: Symbol) (expr :: expectation) = It title expr infixr 3 #

Alias for It, note that the number of ~s is alway a multiple of 3. This provides the impression of an underlined title followed by other expectations.

It allows to write the following type:

type ExpectationWithTitle =
  TypeSpec (

     "This is a title for some assertions:"
     ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

     (2 + 2)  `Is`   4

   )

type (~~~) (title :: Symbol) (expr :: expectation) = It title expr infixr 3 #

type (~~~~~~) (title :: Symbol) (expr :: expectation) = It title expr infixr 3 #

type (~~~~~~~~~) (title :: Symbol) (expr :: expectation) = It title expr infixr 3 #

type (~~~~~~~~~~~~) (title :: Symbol) (expr :: expectation) = It title expr infixr 3 #

type (~~~~~~~~~~~~~~~) (title :: Symbol) (expr :: expectation) = It title expr infixr 3 #

type (~~~~~~~~~~~~~~~~~~) (title :: Symbol) (expr :: expectation) = It title expr infixr 3 #

type (~~~~~~~~~~~~~~~~~~~~~) (title :: Symbol) (expr :: expectation) = It title expr infixr 3 #

type (~~~~~~~~~~~~~~~~~~~~~~~~) (title :: Symbol) (expr :: expectation) = It title expr infixr 3 #

type (~~~~~~~~~~~~~~~~~~~~~~~~~~~) (title :: Symbol) (expr :: expectation) = It title expr infixr 3 #

type (~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~) (title :: Symbol) (expr :: expectation) = It title expr infixr 3 #

type (~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~) (title :: Symbol) (expr :: expectation) = It title expr infixr 3 #

type (~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~) (title :: Symbol) (expr :: expectation) = It title expr infixr 3 #

type (~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~) (title :: Symbol) (expr :: expectation) = It title expr infixr 3 #

type (~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~) (title :: Symbol) (expr :: expectation) = It title expr infixr 3 #

type (~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~) (title :: Symbol) (expr :: expectation) = It title expr infixr 3 #

type (~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~) (title :: Symbol) (expr :: expectation) = It title expr infixr 3 #

type (~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~) (title :: Symbol) (expr :: expectation) = It title expr infixr 3 #

type (~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~) (title :: Symbol) (expr :: expectation) = It title expr infixr 3 #

type (~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~) (title :: Symbol) (expr :: expectation) = It title expr infixr 3 #

type (~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~) (title :: Symbol) (expr :: expectation) = It title expr infixr 3 #

type (~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~) (title :: Symbol) (expr :: expectation) = It title expr infixr 3 #

type (~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~) (title :: Symbol) (expr :: expectation) = It title expr infixr 3 #

type (~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~) (title :: Symbol) (expr :: expectation) = It title expr infixr 3 #

type (~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~) (title :: Symbol) (expr :: expectation) = It title expr infixr 3 #

type (###) (title :: Symbol) (expr :: expectation) = Explain title expr infixr 1 #

Create a TypeSpec with an initial description or title followed by some expectations. Note that the number of #s is alway a multiple of 3.

It allows to rewrite the example above in a shorter way:

type ExpectationWithTitleShorter =

  "This is a title for some assertions:"
  ######################################

  (2 + 2)  `Is`   4

type (######) (title :: Symbol) (expr :: expectation) = Explain title expr infixr 1 #

type (#########) (title :: Symbol) (expr :: expectation) = Explain title expr infixr 1 #

type (############) (title :: Symbol) (expr :: expectation) = Explain title expr infixr 1 #

type (###############) (title :: Symbol) (expr :: expectation) = Explain title expr infixr 1 #

type (##################) (title :: Symbol) (expr :: expectation) = Explain title expr infixr 1 #

type (#####################) (title :: Symbol) (expr :: expectation) = Explain title expr infixr 1 #

type (########################) (title :: Symbol) (expr :: expectation) = Explain title expr infixr 1 #

type (###########################) (title :: Symbol) (expr :: expectation) = Explain title expr infixr 1 #

type (##############################) (title :: Symbol) (expr :: expectation) = Explain title expr infixr 1 #

type (#################################) (title :: Symbol) (expr :: expectation) = Explain title expr infixr 1 #

type (####################################) (title :: Symbol) (expr :: expectation) = Explain title expr infixr 1 #

type (#######################################) (title :: Symbol) (expr :: expectation) = Explain title expr infixr 1 #

type (##########################################) (title :: Symbol) (expr :: expectation) = Explain title expr infixr 1 #

type (#############################################) (title :: Symbol) (expr :: expectation) = Explain title expr infixr 1 #

type (################################################) (title :: Symbol) (expr :: expectation) = Explain title expr infixr 1 #

type (###################################################) (title :: Symbol) (expr :: expectation) = Explain title expr infixr 1 #

type (######################################################) (title :: Symbol) (expr :: expectation) = Explain title expr infixr 1 #

type (#########################################################) (title :: Symbol) (expr :: expectation) = Explain title expr infixr 1 #

type (############################################################) (title :: Symbol) (expr :: expectation) = Explain title expr infixr 1 #

type (###############################################################) (title :: Symbol) (expr :: expectation) = Explain title expr infixr 1 #

type (##################################################################) (title :: Symbol) (expr :: expectation) = Explain title expr infixr 1 #

type (#####################################################################) (title :: Symbol) (expr :: expectation) = Explain title expr infixr 1 #

type (########################################################################) (title :: Symbol) (expr :: expectation) = Explain title expr infixr 1 #

type (-*-) (expectation1 :: k) (expectation2 :: k1) = expectation1 -/- expectation2 infixr 3 #

Crazy operator alias for -/- with higher precedence.

It allows to group expectations more beautiful than using type level lists.

specCrazyMoreNested ::

  "Title"
  ######

    "Top-level "
    ~~~~~~~~~~~~

         "Nested:"
         ~~~~~~~~~
         Int `Is` Int
                            -*-
         Int `Is` Int
                            -*-
         Int `Is` Int

                            -/-

    "Top-level "
    ~~~~~~~~~~~~

         "Nested:"
         ~~~~~~~~~
         Int `Is` Int
                            -*-
             "Nested:"
             ~~~~~~~~~
             Int `Is` Int
                            -*-
             Int `Is` Int

specCrazyMoreNested = Valid

type (-*) (expectation1 :: k) (expectation2 :: k1) = expectation1 -/- expectation2 infixr 4 #

Crazy operator alias for -/-.

Make a list of expectations. The precedence of this operator is even higher than that of -*-.

type Expect = (TypeSpec :: k -> Type) #

type Explain (does :: Symbol) (this :: expectation) = TypeSpec (It does this) #

type Is = (ShouldBe :: actual -> expected -> Type) #

type IsTheSameAs = (ShouldBe :: actual -> expected -> Type) #

type TheseAreEqual = (ShouldBe :: actual -> expected -> Type) #

type IsNot = (ShouldNotBe :: actual -> expected -> Type) #

type Isn't = (ShouldNotBe :: actual -> expected -> Type) #

type IsNotTheSameAs = (ShouldNotBe :: actual -> expected -> Type) #

type IsDifferentFrom = (ShouldNotBe :: actual -> expected -> Type) #

type TheseAreNotEqual = (ShouldNotBe :: actual -> expected -> Type) #

type IsTrue = (ShouldBeTrue :: expectation -> Type) #

type And = (ShouldBeTrue :: expectation -> Type) #

type Therefore = (ShouldBeTrue :: expectation -> Type) #

type That = (ShouldBeTrue :: expectation -> Type) #

type IsFalse = (ShouldBeFalse :: expectation -> Type) #

type They (message :: Symbol) (expectations :: expectation) = It message expectations #

type Describe = (It :: Symbol -> expectation -> Type) #

type Context = (It :: Symbol -> expectation -> Type) #

type It's = (It :: Symbol -> expectation -> Type) #

data ShouldBeTrue (a :: expectation) :: forall expectation. expectation -> Type #

State that a type is equal to the type level True.

Instances
PrettyTypeSpec (ShouldBeTrue a :: Type) 
Instance details

Defined in Test.TypeSpec.ShouldBe

Methods

prettyTypeSpec :: proxy (ShouldBeTrue a) -> Doc #

type EvalExpectation (ShouldBeTrue t2 :: Type) 
Instance details

Defined in Test.TypeSpec.ShouldBe

type EvalExpectation (ShouldBeTrue t2 :: Type) = If (EqExtra t2 True) (OK (ShouldBeTrue t2)) (FAILED (Text "Should have been 'True: " :<>: ShowType t2))

data ShouldBeFalse (a :: expectation) :: forall expectation. expectation -> Type #

State that a type is equal to the type level False.

Instances
PrettyTypeSpec (ShouldBeFalse a :: Type) 
Instance details

Defined in Test.TypeSpec.ShouldBe

Methods

prettyTypeSpec :: proxy (ShouldBeFalse a) -> Doc #

type EvalExpectation (ShouldBeFalse t2 :: Type) 
Instance details

Defined in Test.TypeSpec.ShouldBe

type EvalExpectation (ShouldBeFalse t2 :: Type) = If (EqExtra t2 False) (OK (ShouldBeFalse t2)) (FAILED (Text "Should have been 'False: " :<>: ShowType t2))

data ButNot (a :: shouldBe) (b :: shouldntBe) :: forall shouldBe shouldntBe. shouldBe -> shouldntBe -> Type #

State that one type is different to two other types. This must always be used right next to a ShouldBe pair, otherwise this will not work.

Instances
a ~ ShouldBe a0 a1 => PrettyTypeSpec (ButNot a b :: Type) 
Instance details

Defined in Test.TypeSpec.ShouldBe

Methods

prettyTypeSpec :: proxy (ButNot a b) -> Doc #

type EvalExpectation (ButNot (ShouldBe actual expected) other :: Type) 
Instance details

Defined in Test.TypeSpec.ShouldBe

type EvalExpectation (ButNot (ShouldBe actual expected) other :: Type) = If (EqExtra actual expected) (If (EqExtra other expected) (FAILED (((Text "Expected type: " :$$: (Text " " :<>: ShowType expected)) :$$: Text "to be different from: ") :$$: (Text " " :<>: ShowType other))) (OK (ButNot (ShouldBe actual expected) other))) (FAILED ((Text "Expected type: " :<>: ShowType expected) :$$: (Text "Actual type: " :<>: ShowType actual)))

data ShouldBe (a :: actual) (b :: expected) :: forall actual expected. actual -> expected -> Type #

State that two types or type constructs are boiled down to the same type.

Instances
PrettyTypeSpec (ShouldBe a b :: Type) 
Instance details

Defined in Test.TypeSpec.ShouldBe

Methods

prettyTypeSpec :: proxy (ShouldBe a b) -> Doc #

type EvalExpectation (ButNot (ShouldBe actual expected) other :: Type) 
Instance details

Defined in Test.TypeSpec.ShouldBe

type EvalExpectation (ButNot (ShouldBe actual expected) other :: Type) = If (EqExtra actual expected) (If (EqExtra other expected) (FAILED (((Text "Expected type: " :$$: (Text " " :<>: ShowType expected)) :$$: Text "to be different from: ") :$$: (Text " " :<>: ShowType other))) (OK (ButNot (ShouldBe actual expected) other))) (FAILED ((Text "Expected type: " :<>: ShowType expected) :$$: (Text "Actual type: " :<>: ShowType actual)))
type EvalExpectation (ShouldBe actual expected :: Type) 
Instance details

Defined in Test.TypeSpec.ShouldBe

type EvalExpectation (ShouldBe actual expected :: Type) = If (EqExtra actual expected) (OK (ShouldBe actual expected)) (FAILED ((Text "Expected type: " :<>: ShowType expected) :$$: (Text "Actual type: " :<>: ShowType actual)))

data ShouldNotBe (a :: actual) (b :: expected) :: forall actual expected. actual -> expected -> Type #

State that two types or type constructs are NOT the same type.

Instances
PrettyTypeSpec (ShouldNotBe a b :: Type) 
Instance details

Defined in Test.TypeSpec.ShouldBe

Methods

prettyTypeSpec :: proxy (ShouldNotBe a b) -> Doc #

type EvalExpectation (ShouldNotBe actual2 expected2 :: Type) 
Instance details

Defined in Test.TypeSpec.ShouldBe

type EvalExpectation (ShouldNotBe actual2 expected2 :: Type) = If (EqExtra expected2 actual2) (FAILED (((Text "Expected type: " :$$: (Text " " :<>: ShowType expected2)) :$$: Text "to be different from: ") :$$: (Text " " :<>: ShowType actual2))) (OK (ShouldNotBe actual2 expected2))

data It (a :: Symbol) (b :: expectation) :: forall expectation. Symbol -> expectation -> Type #

Add a type level string as label or longer descripton around expectations. This is analog to the it function in the hspec package.

Instances
(KnownSymbol msg, PrettyTypeSpec x) => PrettyTypeSpec (It msg x :: Type) 
Instance details

Defined in Test.TypeSpec.Label

Methods

prettyTypeSpec :: proxy (It msg x) -> Doc #

type EvalExpectation (It message expectation2 :: Type) 
Instance details

Defined in Test.TypeSpec.Label

type EvalExpectation (It message expectation2 :: Type) = PrependToError (Text message :$$: Text " ") (EvalExpectation expectation2) >> OK (It message expectation2)

data (expectation1 :: k) -/- (expectation2 :: k1) :: forall k k1. k -> k1 -> Type infixr 1 #

Combine two expectations.

Make a collection of expectations:

  (2 + 2)  `Is`     4
                          -/-
  (4 + 4)  `Is`     8
                          -/-
  'True    `IsNot` 'False
Instances
(PrettyTypeSpec expectation1, PrettyTypeSpec expectation2) => PrettyTypeSpec (expectation1 -/- expectation2 :: Type)

Pretty Printing Instance.

Instance details

Defined in Test.TypeSpec.Group

Methods

prettyTypeSpec :: proxy (expectation1 -/- expectation2) -> Doc #

type EvalExpectation (expectation -/- expectations :: Type) 
Instance details

Defined in Test.TypeSpec.Group

type EvalExpectation (expectation -/- expectations :: Type) = (TyCon2 ((-/-) :: a2 -> a1 -> Type) <$> EvalExpectation expectation) <*> EvalExpectation expectations

prettyIndentation :: Int #

The default indention to use when nesting Documents.

data TypeSpec (expectation :: k) :: forall k. k -> Type where #

A type specification.

Constructors

Valid :: forall k (expectation :: k). Try (EvalExpectation expectation) ~ expectation => TypeSpec expectation

Expect the given expectations to hold. If the compiler does not reject it - the expectation seem plausible.

Invalid :: forall k (expectation :: k). DontTry (EvalExpectation expectation) => TypeSpec expectation

Expect the given expectations to **NOT** hold. If the compiler does not reject it - the expectation seem indeed implausible.

Instances
PrettyTypeSpec t => Show (TypeSpec t) 
Instance details

Defined in Test.TypeSpec.Core

Methods

showsPrec :: Int -> TypeSpec t -> ShowS #

show :: TypeSpec t -> String #

showList :: [TypeSpec t] -> ShowS #

type family EvalExpectation (expectation :: k) :: Result k #

An open family of type level expectation evaluators, that return either () or an ErrorMessage.

Instances
type EvalExpectation (ShouldBeTrue t2 :: Type) 
Instance details

Defined in Test.TypeSpec.ShouldBe

type EvalExpectation (ShouldBeTrue t2 :: Type) = If (EqExtra t2 True) (OK (ShouldBeTrue t2)) (FAILED (Text "Should have been 'True: " :<>: ShowType t2))
type EvalExpectation (ShouldBeFalse t2 :: Type) 
Instance details

Defined in Test.TypeSpec.ShouldBe

type EvalExpectation (ShouldBeFalse t2 :: Type) = If (EqExtra t2 False) (OK (ShouldBeFalse t2)) (FAILED (Text "Should have been 'False: " :<>: ShowType t2))
type EvalExpectation (It message expectation2 :: Type) 
Instance details

Defined in Test.TypeSpec.Label

type EvalExpectation (It message expectation2 :: Type) = PrependToError (Text message :$$: Text " ") (EvalExpectation expectation2) >> OK (It message expectation2)
type EvalExpectation (ButNot (ShouldBe actual expected) other :: Type) 
Instance details

Defined in Test.TypeSpec.ShouldBe

type EvalExpectation (ButNot (ShouldBe actual expected) other :: Type) = If (EqExtra actual expected) (If (EqExtra other expected) (FAILED (((Text "Expected type: " :$$: (Text " " :<>: ShowType expected)) :$$: Text "to be different from: ") :$$: (Text " " :<>: ShowType other))) (OK (ButNot (ShouldBe actual expected) other))) (FAILED ((Text "Expected type: " :<>: ShowType expected) :$$: (Text "Actual type: " :<>: ShowType actual)))
type EvalExpectation (ShouldBe actual expected :: Type) 
Instance details

Defined in Test.TypeSpec.ShouldBe

type EvalExpectation (ShouldBe actual expected :: Type) = If (EqExtra actual expected) (OK (ShouldBe actual expected)) (FAILED ((Text "Expected type: " :<>: ShowType expected) :$$: (Text "Actual type: " :<>: ShowType actual)))
type EvalExpectation (ShouldNotBe actual2 expected2 :: Type) 
Instance details

Defined in Test.TypeSpec.ShouldBe

type EvalExpectation (ShouldNotBe actual2 expected2 :: Type) = If (EqExtra expected2 actual2) (FAILED (((Text "Expected type: " :$$: (Text " " :<>: ShowType expected2)) :$$: Text "to be different from: ") :$$: (Text " " :<>: ShowType actual2))) (OK (ShouldNotBe actual2 expected2))
type EvalExpectation ([] :: [k])

Given a list (expectation : rest) try to evaluate the expectation then, if no error was returned, the rest.

Instance details

Defined in Test.TypeSpec.Core

type EvalExpectation ([] :: [k]) = OK ([] :: [k])
type EvalExpectation (expectation ': rest :: [a]) 
Instance details

Defined in Test.TypeSpec.Core

type EvalExpectation (expectation ': rest :: [a]) = ((Cons'' :: TyFun a ([a] ~> [a]) -> Type) <$> EvalExpectation expectation) <*> EvalExpectation rest
type EvalExpectation (expectation -/- expectations :: Type) 
Instance details

Defined in Test.TypeSpec.Group

type EvalExpectation (expectation -/- expectations :: Type) = (TyCon2 ((-/-) :: a2 -> a1 -> Type) <$> EvalExpectation expectation) <*> EvalExpectation expectations
type EvalExpectation ((,) a3 b :: (a2, a1))

Given a pair (expectation1, expectation2) try to evaluate the first then, if no error was returned, the second.

Instance details

Defined in Test.TypeSpec.Core

type EvalExpectation ((,) a3 b :: (a2, a1)) = ((Pair'' :: TyFun a2 (a1 ~> (a2, a1)) -> Type) <$> EvalExpectation a3) <*> EvalExpectation b

class PrettyTypeSpec (t :: k) where #

A class for pretty printing via the Show instance of TypeSpec.

Methods

prettyTypeSpec :: proxy t -> Doc #

Instances
PrettyTypeSpec (ShouldBeTrue a :: Type) 
Instance details

Defined in Test.TypeSpec.ShouldBe

Methods

prettyTypeSpec :: proxy (ShouldBeTrue a) -> Doc #

PrettyTypeSpec (ShouldBeFalse a :: Type) 
Instance details

Defined in Test.TypeSpec.ShouldBe

Methods

prettyTypeSpec :: proxy (ShouldBeFalse a) -> Doc #

(KnownSymbol msg, PrettyTypeSpec x) => PrettyTypeSpec (It msg x :: Type) 
Instance details

Defined in Test.TypeSpec.Label

Methods

prettyTypeSpec :: proxy (It msg x) -> Doc #

a ~ ShouldBe a0 a1 => PrettyTypeSpec (ButNot a b :: Type) 
Instance details

Defined in Test.TypeSpec.ShouldBe

Methods

prettyTypeSpec :: proxy (ButNot a b) -> Doc #

PrettyTypeSpec (ShouldBe a b :: Type) 
Instance details

Defined in Test.TypeSpec.ShouldBe

Methods

prettyTypeSpec :: proxy (ShouldBe a b) -> Doc #

PrettyTypeSpec (ShouldNotBe a b :: Type) 
Instance details

Defined in Test.TypeSpec.ShouldBe

Methods

prettyTypeSpec :: proxy (ShouldNotBe a b) -> Doc #

PrettyTypeSpec ([] :: [k]) 
Instance details

Defined in Test.TypeSpec.Core

Methods

prettyTypeSpec :: proxy [] -> Doc #

(PrettyTypeSpec expectation, PrettyTypeSpec rest) => PrettyTypeSpec (expectation ': rest :: [a]) 
Instance details

Defined in Test.TypeSpec.Core

Methods

prettyTypeSpec :: proxy (expectation ': rest) -> Doc #

(PrettyTypeSpec expectation1, PrettyTypeSpec expectation2) => PrettyTypeSpec (expectation1 -/- expectation2 :: Type)

Pretty Printing Instance.

Instance details

Defined in Test.TypeSpec.Group

Methods

prettyTypeSpec :: proxy (expectation1 -/- expectation2) -> Doc #

(PrettyTypeSpec expectation1, PrettyTypeSpec expectation2) => PrettyTypeSpec ((,) expectation1 expectation2 :: (k2, k1)) 
Instance details

Defined in Test.TypeSpec.Core

Methods

prettyTypeSpec :: proxy (expectation1, expectation2) -> Doc #

type Result = Either ErrorMessage #

When a type level expectation is tested, it might be that compound expectations fail. In order to have a small, precise error message, the type level assertion results are made to have kind Result.

type OK = (Right :: b -> Either a b) #

A nice alias for Left

type FAILED = (Left :: a -> Either a b) #

A nice alias for Right

type family Try (e :: Result k) :: k where ... #

Return the result or fail with a TypeError

Equations

Try (OK d :: Either ErrorMessage k) = d 
Try (FAILED m :: Either ErrorMessage k) = (TypeError m :: k) 

type family DontTry (e :: Result r) :: Constraint where ... #

A constraint that is satisfied if the parameter is Left. Fails with a TypeError otherwise.

Equations

DontTry (FAILED e :: Either ErrorMessage r) = () 
DontTry (OK okIsNotOk :: Either ErrorMessage t) = (TypeError ((Text "You specified this wasn't okay: " :$$: (Text " " :<>: ShowType okIsNotOk)) :$$: Text "... turns out it actually is!") :: Constraint) 

type family PrependToError (message :: ErrorMessage) (result :: Result a) :: Result a where ... #

In case of Left ErrorMessage prepend a message to the message, if the parameter was Right x just return Right x.

Equations

PrependToError message (OK x :: Either ErrorMessage b) = OK x 
PrependToError message (FAILED otherMessage :: Either ErrorMessage a) = FAILED (message :<>: otherMessage) 

type family IsSequence (bs :: [k]) (rs :: [j]) :: Bool where ... Source #

Equations

IsSequence '[] '[] = True 
IsSequence (b ': bs) '[] = False 
IsSequence '[] (OnceOptionalX r ': rs) = IsSequence '[] rs 
IsSequence (b ': bs) (OnceOptionalX r ': rs) = If (IsRuleConform b r) (IsSequence bs rs) (IsSequence (b ': bs) rs) 
IsSequence '[] (SomeOptionalX r ': rs) = IsSequence '[] rs 
IsSequence (b ': bs) (SomeOptionalX r ': rs) = If (IsRuleConform b r) (IsSequence bs (SomeOptionalX r ': rs)) (IsSequence (b ': bs) rs) 
IsSequence '[] (SomeMandatoryX r ': rs) = False 
IsSequence (b ': bs) (SomeMandatoryX r ': rs) = IsRuleConform b r && IsSequence bs (SomeOptionalX r ': rs) 
IsSequence '[] (r ': rs) = False 
IsSequence (b ': bs) (r ': rs) = IsRuleConform b r && IsSequence bs rs 

type family ToSymbol t :: Symbol Source #

data MatchSymbol :: Symbol -> Type Source #

Instances
type IsRuleConform (b :: Type) (MatchSymbol fourcc :: Type) Source # 
Instance details

Defined in Data.ByteString.IsoBaseFileFormat.Util.TypeLayout

type IsRuleConform (b :: Type) (MatchSymbol fourcc :: Type) = ToSymbol b == fourcc

data OneOf :: [Type] -> Type Source #

Instances
type IsRuleConform (t :: k) (OneOf (r ': rs) :: Type) Source # 
Instance details

Defined in Data.ByteString.IsoBaseFileFormat.Util.TypeLayout

type IsRuleConform (t :: k) (OneOf (r ': rs) :: Type) = IsRuleConform t r || IsRuleConform t (OneOf rs)
type IsRuleConform (t :: k) (OneOf ([] :: [Type])) Source # 
Instance details

Defined in Data.ByteString.IsoBaseFileFormat.Util.TypeLayout

type IsRuleConform (t :: k) (OneOf ([] :: [Type])) = False

data TopLevel :: Type -> Type Source #

Instances
type IsRuleConform (t :: k) (TopLevel rule :: Type) Source # 
Instance details

Defined in Data.ByteString.IsoBaseFileFormat.Util.TypeLayout

type IsRuleConform (t :: k) (TopLevel rule :: Type) = IsRuleConform t rule

type family IsRuleConform (b :: k) (r :: l) :: Bool Source #

Instances
type IsRuleConform (t :: k) (TopLevel rule :: Type) Source # 
Instance details

Defined in Data.ByteString.IsoBaseFileFormat.Util.TypeLayout

type IsRuleConform (t :: k) (TopLevel rule :: Type) = IsRuleConform t rule
type IsRuleConform (t :: k) (OneOf (r ': rs) :: Type) Source # 
Instance details

Defined in Data.ByteString.IsoBaseFileFormat.Util.TypeLayout

type IsRuleConform (t :: k) (OneOf (r ': rs) :: Type) = IsRuleConform t r || IsRuleConform t (OneOf rs)
type IsRuleConform (t :: k) (OneOf ([] :: [Type])) Source # 
Instance details

Defined in Data.ByteString.IsoBaseFileFormat.Util.TypeLayout

type IsRuleConform (t :: k) (OneOf ([] :: [Type])) = False
type IsRuleConform (b :: Type) (MatchSymbol fourcc :: Type) Source # 
Instance details

Defined in Data.ByteString.IsoBaseFileFormat.Util.TypeLayout

type IsRuleConform (b :: Type) (MatchSymbol fourcc :: Type) = ToSymbol b == fourcc
type IsRuleConform (Box (SampleEntry handlerSpecificEntry) :: Type) (MatchSampleEntry handlerType :: Type) Source # 
Instance details

Defined in Data.ByteString.IsoBaseFileFormat.Boxes.SampleEntry

type IsRuleConform (Box (SampleEntry handlerSpecificEntry) :: Type) (MatchSampleEntry handlerType :: Type) = HandlerTypeCode (GetHandlerType handlerSpecificEntry) == HandlerTypeCode handlerType
type IsRuleConform (bs :: [Type]) (sq :: [Type]) Source # 
Instance details

Defined in Data.ByteString.IsoBaseFileFormat.Util.TypeLayout

type IsRuleConform (bs :: [Type]) (sq :: [Type]) = IsSequence bs sq
type IsRuleConform (Boxes bs :: Type) (Boxes rs :: Type) Source # 
Instance details

Defined in Data.ByteString.IsoBaseFileFormat.Box

type IsRuleConform (Boxes bs :: Type) (Boxes rs :: Type) = IsRuleConform bs rs
type IsRuleConform (Box b :: Type) (Box r :: Type) Source # 
Instance details

Defined in Data.ByteString.IsoBaseFileFormat.Box

type IsRuleConform (Box b :: Type) (ContainerBox b' rules :: Type) Source # 
Instance details

Defined in Data.ByteString.IsoBaseFileFormat.Box

data Fun4 :: (a -> b -> c -> d -> IsAn e) -> IsA (a :-> IsA (b :-> IsA (c :-> IsA (d :-> IsAn e)))) Source #

Instances
type (Fun4 f :: A (foo :-> IsA (a :-> IsA (b :-> IsA (c :-> IsAn d)))) -> Type) $~ (x :: foo) Source # 
Instance details

Defined in Data.Kind.Extra

type (Fun4 f :: A (foo :-> IsA (a :-> IsA (b :-> IsA (c :-> IsAn d)))) -> Type) $~ (x :: foo) = Fun3 (f x)

data Fun3 :: (a -> b -> c -> IsA d) -> IsA (a :-> IsA (b :-> IsA (c :-> IsA d))) Source #

Instances
type (Fun3 f :: A (foo :-> IsA (a :-> IsA (b :-> IsA c))) -> Type) $~ (x :: foo) Source # 
Instance details

Defined in Data.Kind.Extra

type (Fun3 f :: A (foo :-> IsA (a :-> IsA (b :-> IsA c))) -> Type) $~ (x :: foo) = Fun2 (f x)

data Fun2 :: (a -> b -> IsA c) -> IsA (a :-> IsA (b :-> IsA c)) Source #

Instances
type (Fun2 f :: A (foo :-> IsA (a :-> IsA b)) -> Type) $~ (x :: foo) Source # 
Instance details

Defined in Data.Kind.Extra

type (Fun2 f :: A (foo :-> IsA (a :-> IsA b)) -> Type) $~ (x :: foo) = Fun1 (f x)

data Fun1 :: (a -> IsA b) -> IsA (a :-> IsA b) Source #

Like TyCon1 from Data.Singletons

Instances
type (Fun1 f :: A (foo :-> IsA b) -> Type) $~ (x :: foo) Source # 
Instance details

Defined in Data.Kind.Extra

type (Fun1 f :: A (foo :-> IsA b) -> Type) $~ (x :: foo) = f x

type family FoldMap (append :: IsA (bar :-> IsA (bar :-> bar))) (zero :: bar) (f :: IsA (foo :-> bar)) (xs :: [(foo :: Type)]) :: (bar :: Type) where ... Source #

Map over the elements of a list and fold the result.

Equations

FoldMap append zero f '[] = zero 
FoldMap append zero f (x ': xs) = (append $~ (f $~ x)) $~ FoldMap append zero f xs 

data Optional :: IsA t -> IsA (s :-> IsA t) -> IsA (Maybe s :-> IsA t) Source #

Either use the value from Just or return a fallback value(types(kinds))

Instances
type (Optional fallback f :: A (Maybe s :-> IsA t) -> Type) $~ (Nothing :: Maybe s) Source # 
Instance details

Defined in Data.Kind.Extra

type (Optional fallback f :: A (Maybe s :-> IsA t) -> Type) $~ (Nothing :: Maybe s) = fallback
type (Optional fallback f :: A (Maybe foo :-> IsA t) -> Type) $~ (Just s :: Maybe foo) Source # 
Instance details

Defined in Data.Kind.Extra

type (Optional fallback f :: A (Maybe foo :-> IsA t) -> Type) $~ (Just s :: Maybe foo) = f $~ s

data (:>>=:) :: IsA foo -> IsA (foo :-> IsA bar) -> IsA bar infixl 1 Source #

Eval and ApplyCompose functions

Instances
type Eval (x :>>=: f :: A foo2 -> Type) Source # 
Instance details

Defined in Data.Kind.Extra

type Eval (x :>>=: f :: A foo2 -> Type) = Eval (f $~ Eval x)

data Extract :: IsA (IsA x :-> x) Source #

A function that applies Eval

Instances
type (Extract :: A (IsA foo :-> foo) -> Type) $~ (x :: IsA foo) Source # 
Instance details

Defined in Data.Kind.Extra

type (Extract :: A (IsA foo :-> foo) -> Type) $~ (x :: IsA foo) = Eval x

data (:^>>>^:) :: IsA (good :-> better) -> IsA (better :-> best) -> IsA (IsA good :-> IsA best) infixl 1 Source #

Eval compose and return

Instances
type (f :^>>>^: g :: A (IsA foo :-> IsA o) -> Type) $~ (x :: IsA foo) Source # 
Instance details

Defined in Data.Kind.Extra

type (f :^>>>^: g :: A (IsA foo :-> IsA o) -> Type) $~ (x :: IsA foo) = Return (g $~ (f $~ Eval x))

data (:>>>^:) :: IsA (good :-> better) -> IsA (better :-> best) -> IsA (good :-> IsA best) infixl 1 Source #

Compose and Return

Instances
type (f :>>>^: g :: A (foo :-> IsA o) -> Type) $~ (x :: foo) Source # 
Instance details

Defined in Data.Kind.Extra

type (f :>>>^: g :: A (foo :-> IsA o) -> Type) $~ (x :: foo) = Return (g $~ (f $~ x))

data (:^>>>:) :: IsA (good :-> better) -> IsA (better :-> best) -> IsA (IsA good :-> best) infixl 1 Source #

Eval Input & Compose

Instances
type (f :^>>>: g :: A (IsA foo :-> bar2) -> Type) $~ (x :: IsA foo) Source # 
Instance details

Defined in Data.Kind.Extra

type (f :^>>>: g :: A (IsA foo :-> bar2) -> Type) $~ (x :: IsA foo) = g $~ (f $~ Eval x)

data (:>>>:) :: IsA (good :-> better) -> IsA (better :-> best) -> IsA (good :-> best) infixl 1 Source #

Compose functions

Instances
type (f :>>>: g :: A (foo :-> bar2) -> Type) $~ (x :: foo) Source # 
Instance details

Defined in Data.Kind.Extra

type (f :>>>: g :: A (foo :-> bar2) -> Type) $~ (x :: foo) = g $~ (f $~ x)

type (^*^) (f :: IsA (foo :-> bar)) (x :: IsA foo) = f $~ Eval x infixl 0 Source #

Symbolic function application

data Id :: IsA (foo :-> foo) Source #

Identity

Instances
type (Id :: A (bar :-> bar) -> Type) $~ (x :: bar) Source # 
Instance details

Defined in Data.Kind.Extra

type (Id :: A (bar :-> bar) -> Type) $~ (x :: bar) = x

type Apply f x = f $~ x Source #

An alias for $~

type family (f :: IsA (foo :-> bar)) $~ (x :: foo) :: bar infixl 0 Source #

An open family of functions from foo to bar

Instances
type (BitRecordAppendFun_ l :: A (BitRecord :-> BitRecord) -> Type) $~ (r :: BitRecord) Source # 
Instance details

Defined in Data.Type.BitRecords.Core

type (Id :: A (bar :-> bar) -> Type) $~ (x :: bar) Source # 
Instance details

Defined in Data.Kind.Extra

type (Id :: A (bar :-> bar) -> Type) $~ (x :: bar) = x
type (f :>>>: g :: A (foo :-> bar2) -> Type) $~ (x :: foo) Source # 
Instance details

Defined in Data.Kind.Extra

type (f :>>>: g :: A (foo :-> bar2) -> Type) $~ (x :: foo) = g $~ (f $~ x)
type (Extract :: A (IsA foo :-> foo) -> Type) $~ (x :: IsA foo) Source # 
Instance details

Defined in Data.Kind.Extra

type (Extract :: A (IsA foo :-> foo) -> Type) $~ (x :: IsA foo) = Eval x
type (BitRecordOfDescriptor :: A (Descriptor tag :-> BitRecord) -> Type) $~ (MkDescriptor body :: Descriptor tag) Source # 
Instance details

Defined in Data.ByteString.Mp4.Boxes.BaseDescriptor

type (f :^>>>: g :: A (IsA foo :-> bar2) -> Type) $~ (x :: IsA foo) Source # 
Instance details

Defined in Data.Kind.Extra

type (f :^>>>: g :: A (IsA foo :-> bar2) -> Type) $~ (x :: IsA foo) = g $~ (f $~ Eval x)
type (Fun1 f :: A (foo :-> IsA b) -> Type) $~ (x :: foo) Source # 
Instance details

Defined in Data.Kind.Extra

type (Fun1 f :: A (foo :-> IsA b) -> Type) $~ (x :: foo) = f x
type (Fun2 f :: A (foo :-> IsA (a :-> IsA b)) -> Type) $~ (x :: foo) Source # 
Instance details

Defined in Data.Kind.Extra

type (Fun2 f :: A (foo :-> IsA (a :-> IsA b)) -> Type) $~ (x :: foo) = Fun1 (f x)
type (Fun3 f :: A (foo :-> IsA (a :-> IsA (b :-> IsA c))) -> Type) $~ (x :: foo) Source # 
Instance details

Defined in Data.Kind.Extra

type (Fun3 f :: A (foo :-> IsA (a :-> IsA (b :-> IsA c))) -> Type) $~ (x :: foo) = Fun2 (f x)
type (Fun4 f :: A (foo :-> IsA (a :-> IsA (b :-> IsA (c :-> IsAn d)))) -> Type) $~ (x :: foo) Source # 
Instance details

Defined in Data.Kind.Extra

type (Fun4 f :: A (foo :-> IsA (a :-> IsA (b :-> IsA (c :-> IsAn d)))) -> Type) $~ (x :: foo) = Fun3 (f x)
type (f :>>>^: g :: A (foo :-> IsA o) -> Type) $~ (x :: foo) Source # 
Instance details

Defined in Data.Kind.Extra

type (f :>>>^: g :: A (foo :-> IsA o) -> Type) $~ (x :: foo) = Return (g $~ (f $~ x))
type (Optional fallback f :: A (Maybe s :-> IsA t) -> Type) $~ (Nothing :: Maybe s) Source # 
Instance details

Defined in Data.Kind.Extra

type (Optional fallback f :: A (Maybe s :-> IsA t) -> Type) $~ (Nothing :: Maybe s) = fallback
type (Optional fallback f :: A (Maybe foo :-> IsA t) -> Type) $~ (Just s :: Maybe foo) Source # 
Instance details

Defined in Data.Kind.Extra

type (Optional fallback f :: A (Maybe foo :-> IsA t) -> Type) $~ (Just s :: Maybe foo) = f $~ s
type (DescriptorOfDecoderSpecificInfo :: A (DecoderSpecificInfo ot st :-> Descriptor DecSpecificInfo) -> Type) $~ (MkDecoderSpecificInfo body :: DecoderSpecificInfo ot st) Source # 
Instance details

Defined in Data.ByteString.Mp4.Boxes.DecoderSpecificInfo

type (f :^>>>^: g :: A (IsA foo :-> IsA o) -> Type) $~ (x :: IsA foo) Source # 
Instance details

Defined in Data.Kind.Extra

type (f :^>>>^: g :: A (IsA foo :-> IsA o) -> Type) $~ (x :: IsA foo) = Return (g $~ (f $~ Eval x))

data foo :-> bar Source #

A symbolic type-level function.

Instances
type (Fun2 f :: A (foo :-> IsA (a :-> IsA b)) -> Type) $~ (x :: foo) Source # 
Instance details

Defined in Data.Kind.Extra

type (Fun2 f :: A (foo :-> IsA (a :-> IsA b)) -> Type) $~ (x :: foo) = Fun1 (f x)
type (Fun3 f :: A (foo :-> IsA (a :-> IsA (b :-> IsA c))) -> Type) $~ (x :: foo) Source # 
Instance details

Defined in Data.Kind.Extra

type (Fun3 f :: A (foo :-> IsA (a :-> IsA (b :-> IsA c))) -> Type) $~ (x :: foo) = Fun2 (f x)
type (Fun4 f :: A (foo :-> IsA (a :-> IsA (b :-> IsA (c :-> IsAn d)))) -> Type) $~ (x :: foo) Source # 
Instance details

Defined in Data.Kind.Extra

type (Fun4 f :: A (foo :-> IsA (a :-> IsA (b :-> IsA (c :-> IsAn d)))) -> Type) $~ (x :: foo) = Fun3 (f x)

type Return f = Pure f Source #

data Pure (f :: o) :: IsAn o Source #

A type foo, IsA foo.

Instances
type Eval (Pure f :: A foo -> Type) Source # 
Instance details

Defined in Data.Kind.Extra

type Eval (Pure f :: A foo -> Type) = f

type family Eval (t :: A foo -> Type) :: foo Source #

An open type family to turn symbolic type representations created with A or IsA into the actual types.

Instances
type Eval (OptionalRecord (Nothing :: Maybe BitRecord)) Source # 
Instance details

Defined in Data.Type.BitRecords.Core

type Eval (OptionalRecord (Just t) :: A BitRecord -> Type) Source # 
Instance details

Defined in Data.Type.BitRecords.Core

type Eval (OptionalRecord (Just t) :: A BitRecord -> Type) = t
type Eval (StaticExpandableContent record :: A BitRecord -> Type) Source # 
Instance details

Defined in Data.ByteString.Mp4.Boxes.Expandable

type Eval (Pure f :: A foo -> Type) Source # 
Instance details

Defined in Data.Kind.Extra

type Eval (Pure f :: A foo -> Type) = f
type Eval (RecArray r n :: A BitRecord -> Type) Source # 
Instance details

Defined in Data.Type.BitRecords.Core

type Eval (l :^+ r :: A BitRecord -> Type) Source # 
Instance details

Defined in Data.Type.BitRecords.Core

type Eval (l :^+ r :: A BitRecord -> Type) = Append (Eval l) r
type Eval (l :+^ r :: A BitRecord -> Type) Source # 
Instance details

Defined in Data.Type.BitRecords.Core

type Eval (l :+^ r :: A BitRecord -> Type) = Append l (Eval r)
type Eval (BitRecordOfList f xs :: A BitRecord -> Type) Source # 
Instance details

Defined in Data.Type.BitRecords.Core

type Eval (GASpecificConfig fl cd ext :: A AudioSubConfig -> Type) Source # 
Instance details

Defined in Data.ByteString.Mp4.Boxes.AudioSpecificConfig

type Eval (GASpecificConfig fl cd ext :: A AudioSubConfig -> Type) = (TypeError (Text "AudioSubConfig is abstract!") :: AudioSubConfig)
type Eval (Sized sf r :: A BitRecord -> Type) Source # 
Instance details

Defined in Data.Type.BitRecords.Sized

type Eval (Sized sf r :: A BitRecord -> Type) = (("size" @: sf) := SizeFieldValue r) .+: r
type Eval (x :>>=: f :: A foo2 -> Type) Source # 
Instance details

Defined in Data.Kind.Extra

type Eval (x :>>=: f :: A foo2 -> Type) = Eval (f $~ Eval x)
type Eval (RecordField f :: A BitRecord -> Type) Source # 
Instance details

Defined in Data.Type.BitRecords.Core

type Eval (MaybeField (Nothing :: Maybe (IsA (BitRecordField t))) :: A BitRecord -> Type) Source # 
Instance details

Defined in Data.Type.BitRecords.Core

type Eval (MaybeField (Just fld) :: A BitRecord -> Type) Source # 
Instance details

Defined in Data.Type.BitRecords.Core

type Eval (SizedField sf r :: A BitRecord -> Type) Source # 
Instance details

Defined in Data.Type.BitRecords.Sized

type Eval (SizedField sf r :: A BitRecord -> Type) = (("size" @: sf) := SizeFieldValue r) .+. r
type Eval (EnumParam label ei :: A (EnumOf enum) -> Type) Source # 
Instance details

Defined in Data.Type.BitRecords.Enum

type Eval (EnumParam label ei :: A (EnumOf enum) -> Type) = MkEnumOf ei (RuntimeFieldValue label :: A (FieldValue label enum) -> Type) EmptyBitRecord
type Eval (EnumParamAlt label (FixedEnum enum size) :: A (EnumOf enum) -> Type) Source # 
Instance details

Defined in Data.Type.BitRecords.Enum

type Eval (EnumParamAlt label (FixedEnum enum size) :: A (EnumOf enum) -> Type) = (TypeError (Text "Cannot assign an extension value to the FixedEnum " :<>: ShowType enum) :: EnumOf enum)
type Eval (EnumParamAlt label (ExtEnum enum size extInd extField) :: A (EnumOf enum) -> Type) Source # 
Instance details

Defined in Data.Type.BitRecords.Enum

type Eval (EnumParamAlt label (ExtEnum enum size extInd extField) :: A (EnumOf enum) -> Type) = MkEnumOf (ExtEnum enum size extInd extField) (StaticFieldValue label extInd) (BitRecordMember (extField :~ (RuntimeFieldValue label :: A (FieldValue label st) -> Type)))
type Eval (SetEnum l ei value :: A (EnumOf enum) -> Type) Source # 
Instance details

Defined in Data.Type.BitRecords.Enum

type Eval (SetEnum l ei value :: A (EnumOf enum) -> Type) = MkEnumOf ei (StaticFieldValue l value) EmptyBitRecord
type Eval (SetEnumAlt l (FixedEnum enum size) value :: A (EnumOf enum) -> Type) Source # 
Instance details

Defined in Data.Type.BitRecords.Enum

type Eval (SetEnumAlt l (FixedEnum enum size) value :: A (EnumOf enum) -> Type) = (TypeError (Text "Cannot assign an 'extended' value to the 'FixedEnum' " :<>: ShowType enum) :: EnumOf enum)
type Eval (SetEnumAlt l (ExtEnum enum size extInd extField) value :: A (EnumOf enum) -> Type) Source # 
Instance details

Defined in Data.Type.BitRecords.Enum

type Eval (SetEnumAlt l (ExtEnum enum size extInd extField) value :: A (EnumOf enum) -> Type) = MkEnumOf (ExtEnum enum size extInd extField) (StaticFieldValue l extInd) (BitRecordMember (extField := value))
type Eval Mp4SyncLayerDescriptor Source #

In the holy scripture, ISO-14496-14 section 3.1.2, it is written that there shall be restrictions on the elementary stream descriptor, in there it says: Thou shall use only two as the value for the predefined field in the blessed SLDescriptor. Not one, this is a value not big enough, nor three, this value is too much. The righteous one ever only uses two. Only a fool will use 256.

Instance details

Defined in Data.ByteString.Mp4.Boxes.SyncLayerConfigDescriptor

type Eval (ProfileLevelIndicationIndexDescriptor val :: A (Descriptor ProfileLevelIndicationIndexDescr) -> Type) Source # 
Instance details

Defined in Data.ByteString.Mp4.Boxes.DecoderConfigDescriptor

type Eval (DecoderConfigDescriptor ot st di ps :: A (Descriptor DecoderConfigDescr) -> Type) Source # 
Instance details

Defined in Data.ByteString.Mp4.Boxes.DecoderConfigDescriptor

type Eval (AudioConfigAacMinimal aoId subCfg freq channels :: A (DecoderSpecificInfo AudioIso14496_3 AudioStream) -> Type) Source # 
Instance details

Defined in Data.ByteString.Mp4.Boxes.AudioSpecificConfig

type Eval (AudioConfigSbrExplicitHierachical aoId subCfg freq channels extFreq :: A (DecoderSpecificInfo AudioIso14496_3 AudioStream) -> Type) Source # 
Instance details

Defined in Data.ByteString.Mp4.Boxes.AudioSpecificConfig

type Eval (ESDescriptor esId depEsId url ocrEsId streamPrio decConfig slConfig :: A (Descriptor ES_Descr) -> Type) Source # 
Instance details

Defined in Data.ByteString.Mp4.Boxes.ElementaryStreamDescriptor

type Eval (ESDescriptor esId depEsId url ocrEsId streamPrio decConfig slConfig :: A (Descriptor ES_Descr) -> Type) = (MkDescriptor ((((((("esId" @: FieldU16) :~ esId) .+: (("depEsIdFlag" @: FlagJust depEsId) .+: (("urlFlag" @: FlagJust url) .+: (("ocrEsIdFlag" @: FlagJust ocrEsId) .+: ((("streamPriority" @: Field 5) :~ streamPrio) .+: (("depEsId" @: FieldU16) :+? depEsId)))))) :+: Eval (OptionalRecordOf (Fun1 (RecordField :: IsA (BitRecordField (MkFieldCustom :: BitField ASizedString ASizedString len)) -> A BitRecord -> Type)) url)) :+: (("ocrEsId" @: FieldU16) :+? ocrEsId)) :+: ((BitRecordOfDescriptor :: A (Descriptor DecoderConfigDescr :-> BitRecord) -> Type) $~ Eval decConfig)) :+: ((BitRecordOfDescriptor :: A (Descriptor SLConfigDescr :-> BitRecord) -> Type) $~ Eval slConfig)) :: Descriptor ES_Descr)

type IsAn (oo :: k) = (IsA oo :: Type) Source #

An alias to IsA

type IsA (foo :: k) = (A foo -> Type :: Type) Source #

Type alias for A such that data Point2 x y :: A Vec2 -> Type becomes data Point2 x y :: IsA Vec2

data A :: forall foo. foo -> Type where Source #

A group of types that all Eval into the same type. This is an open and extensible alternative to defining an algebraic data type and using the promoted constructors. A goes hand-in-hand with IsA for better readability.

For example:

data PrettyPrinter c where
  RenderText :: Symbol -> PrettyPrinter Symbol
  WithColor :: Color -> PrettyPrinter c -> PrettyPrinter c

data Color = Black | White

data ColoredText :: Color -> Symbol -> IsA (PrettyPrinter Symbol)

type instance Eval (ColoredText c txt) = 'WithColor c ('RenderText txt)

Constructors

MkA :: A foo 
Instances
BitStringBuilderHoley (Proxy (MkField MkFieldFlag)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

Associated Types

type ToBitStringBuilder (Proxy (MkField MkFieldFlag)) a :: Type Source #

BitStringBuilderHoley (Proxy (MkField MkFieldI8)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

Associated Types

type ToBitStringBuilder (Proxy (MkField MkFieldI8)) a :: Type Source #

BitStringBuilderHoley (Proxy (MkField MkFieldI16)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

Associated Types

type ToBitStringBuilder (Proxy (MkField MkFieldI16)) a :: Type Source #

BitStringBuilderHoley (Proxy (MkField MkFieldI32)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

Associated Types

type ToBitStringBuilder (Proxy (MkField MkFieldI32)) a :: Type Source #

BitStringBuilderHoley (Proxy (MkField MkFieldI64)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

Associated Types

type ToBitStringBuilder (Proxy (MkField MkFieldI64)) a :: Type Source #

BitStringBuilderHoley (Proxy (MkField MkFieldU8)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

Associated Types

type ToBitStringBuilder (Proxy (MkField MkFieldU8)) a :: Type Source #

BitStringBuilderHoley (Proxy (MkField MkFieldU16)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

Associated Types

type ToBitStringBuilder (Proxy (MkField MkFieldU16)) a :: Type Source #

BitStringBuilderHoley (Proxy (MkField MkFieldU32)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

Associated Types

type ToBitStringBuilder (Proxy (MkField MkFieldU32)) a :: Type Source #

BitStringBuilderHoley (Proxy (MkField MkFieldU64)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

Associated Types

type ToBitStringBuilder (Proxy (MkField MkFieldU64)) a :: Type Source #

(KnownNat v, BitStringBuilderHoley (Proxy f) a, ToBitStringBuilder (Proxy f) a ~ (rt -> a), Num rt) => BitStringBuilderHoley (Proxy (f := v)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

Associated Types

type ToBitStringBuilder (Proxy (f := v)) a :: Type Source #

(KnownNat v, BitStringBuilderHoley (Proxy f) a, ToBitStringBuilder (Proxy f) a ~ (x -> a), Num x) => BitStringBuilderHoley (Proxy (f := NegativeNat v)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

Associated Types

type ToBitStringBuilder (Proxy (f := NegativeNat v)) a :: Type Source #

(KnownNat v, BitStringBuilderHoley (Proxy f) a, ToBitStringBuilder (Proxy f) a ~ (x -> a), Num x) => BitStringBuilderHoley (Proxy (f := PositiveNat v)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

Associated Types

type ToBitStringBuilder (Proxy (f := PositiveNat v)) a :: Type Source #

BitRecordFieldSize f ~ 1 => BitStringBuilderHoley (Proxy (f := False)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

Associated Types

type ToBitStringBuilder (Proxy (f := False)) a :: Type Source #

BitRecordFieldSize f ~ 1 => BitStringBuilderHoley (Proxy (f := True)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

Associated Types

type ToBitStringBuilder (Proxy (f := True)) a :: Type Source #

BitStringBuilderHoley (Proxy nested) a => BitStringBuilderHoley (Proxy (LabelF l nested)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

Associated Types

type ToBitStringBuilder (Proxy (LabelF l nested)) a :: Type Source #

KnownChunkSize s => BitStringBuilderHoley (Proxy (MkField (MkFieldBits :: BitField (B s) Nat s))) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

Associated Types

type ToBitStringBuilder (Proxy (MkField MkFieldBits)) a :: Type Source #

KnownChunkSize size => BitStringBuilderHoley (Proxy (MkField (MkFieldCustom :: BitField (EnumValue e) e size))) r Source # 
Instance details

Defined in Data.Type.BitRecords.Enum

Associated Types

type ToBitStringBuilder (Proxy (MkField MkFieldCustom)) r :: Type Source #

(KnownNat (FromEnum e v), KnownChunkSize size) => BitStringBuilderHoley (Proxy (f := v)) r Source # 
Instance details

Defined in Data.Type.BitRecords.Enum

Associated Types

type ToBitStringBuilder (Proxy (f := v)) r :: Type Source #

BitStringBuilderHoley (Proxy (Eval r)) a => BitStringBuilderHoley (Proxy r) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

Associated Types

type ToBitStringBuilder (Proxy r) a :: Type Source #

type (Extract :: A (IsA foo :-> foo) -> Type) $~ (x :: IsA foo) Source # 
Instance details

Defined in Data.Kind.Extra

type (Extract :: A (IsA foo :-> foo) -> Type) $~ (x :: IsA foo) = Eval x
type (f :^>>>: g :: A (IsA foo :-> bar2) -> Type) $~ (x :: IsA foo) Source # 
Instance details

Defined in Data.Kind.Extra

type (f :^>>>: g :: A (IsA foo :-> bar2) -> Type) $~ (x :: IsA foo) = g $~ (f $~ Eval x)
type Eval (MaybeField (Nothing :: Maybe (IsA (BitRecordField t))) :: A BitRecord -> Type) Source # 
Instance details

Defined in Data.Type.BitRecords.Core

type Eval (MaybeField (Just fld) :: A BitRecord -> Type) Source # 
Instance details

Defined in Data.Type.BitRecords.Core

type ToPretty (f :: IsA (BitRecordField t)) Source # 
Instance details

Defined in Data.Type.BitRecords.Core

type ToBitStringBuilder (Proxy (MkField MkFieldFlag)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

type ToBitStringBuilder (Proxy (MkField MkFieldI8)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

type ToBitStringBuilder (Proxy (MkField MkFieldI16)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

type ToBitStringBuilder (Proxy (MkField MkFieldI32)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

type ToBitStringBuilder (Proxy (MkField MkFieldI64)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

type ToBitStringBuilder (Proxy (MkField MkFieldU8)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

type ToBitStringBuilder (Proxy (MkField MkFieldU16)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

type ToBitStringBuilder (Proxy (MkField MkFieldU32)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

type ToBitStringBuilder (Proxy (MkField MkFieldU64)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

type ToBitStringBuilder (Proxy (f := NegativeNat v)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

type ToBitStringBuilder (Proxy (f := PositiveNat v)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

type ToBitStringBuilder (Proxy (f := v)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

type ToBitStringBuilder (Proxy (f := v)) a = a
type ToBitStringBuilder (Proxy (f := False)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

type ToBitStringBuilder (Proxy (f := False)) a = a
type ToBitStringBuilder (Proxy (f := True)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

type ToBitStringBuilder (Proxy (f := True)) a = a
type ToBitStringBuilder (Proxy (LabelF l nested)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

type ToBitStringBuilder (Proxy (LabelF l nested)) a = ToBitStringBuilder (Proxy nested) a
type ToBitStringBuilder (Proxy (MkField (MkFieldBits :: BitField (B s) Nat s))) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

type ToBitStringBuilder (Proxy (MkField (MkFieldBits :: BitField (B s) Nat s))) a = B s -> a
type ToBitStringBuilder (Proxy (MkField (MkFieldCustom :: BitField (EnumValue e) e size))) r Source # 
Instance details

Defined in Data.Type.BitRecords.Enum

type ToBitStringBuilder (Proxy (f := v)) r Source # 
Instance details

Defined in Data.Type.BitRecords.Enum

type ToBitStringBuilder (Proxy (f := v)) r = r
type ToBitStringBuilder (Proxy r) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

type (Fun1 f :: A (foo :-> IsA b) -> Type) $~ (x :: foo) Source # 
Instance details

Defined in Data.Kind.Extra

type (Fun1 f :: A (foo :-> IsA b) -> Type) $~ (x :: foo) = f x
type (Fun2 f :: A (foo :-> IsA (a :-> IsA b)) -> Type) $~ (x :: foo) Source # 
Instance details

Defined in Data.Kind.Extra

type (Fun2 f :: A (foo :-> IsA (a :-> IsA b)) -> Type) $~ (x :: foo) = Fun1 (f x)
type (Fun3 f :: A (foo :-> IsA (a :-> IsA (b :-> IsA c))) -> Type) $~ (x :: foo) Source # 
Instance details

Defined in Data.Kind.Extra

type (Fun3 f :: A (foo :-> IsA (a :-> IsA (b :-> IsA c))) -> Type) $~ (x :: foo) = Fun2 (f x)
type (Fun4 f :: A (foo :-> IsA (a :-> IsA (b :-> IsA (c :-> IsAn d)))) -> Type) $~ (x :: foo) Source # 
Instance details

Defined in Data.Kind.Extra

type (Fun4 f :: A (foo :-> IsA (a :-> IsA (b :-> IsA (c :-> IsAn d)))) -> Type) $~ (x :: foo) = Fun3 (f x)
type (f :>>>^: g :: A (foo :-> IsA o) -> Type) $~ (x :: foo) Source # 
Instance details

Defined in Data.Kind.Extra

type (f :>>>^: g :: A (foo :-> IsA o) -> Type) $~ (x :: foo) = Return (g $~ (f $~ x))
type (Optional fallback f :: A (Maybe s :-> IsA t) -> Type) $~ (Nothing :: Maybe s) Source # 
Instance details

Defined in Data.Kind.Extra

type (Optional fallback f :: A (Maybe s :-> IsA t) -> Type) $~ (Nothing :: Maybe s) = fallback
type (Optional fallback f :: A (Maybe foo :-> IsA t) -> Type) $~ (Just s :: Maybe foo) Source # 
Instance details

Defined in Data.Kind.Extra

type (Optional fallback f :: A (Maybe foo :-> IsA t) -> Type) $~ (Just s :: Maybe foo) = f $~ s
type (f :^>>>^: g :: A (IsA foo :-> IsA o) -> Type) $~ (x :: IsA foo) Source # 
Instance details

Defined in Data.Kind.Extra

type (f :^>>>^: g :: A (IsA foo :-> IsA o) -> Type) $~ (x :: IsA foo) = Return (g $~ (f $~ Eval x))
type SizeFieldValue (MkField t :: A (BitRecordField t) -> Type) Source # 
Instance details

Defined in Data.Type.BitRecords.Sized

type SizeFieldValue (MkField t :: A (BitRecordField t) -> Type) = size
type SizeFieldValue (f := v :: A (BitRecordField t) -> Type) Source # 
Instance details

Defined in Data.Type.BitRecords.Sized

type SizeFieldValue (LabelF l f :: A (BitRecordField t) -> Type) Source # 
Instance details

Defined in Data.Type.BitRecords.Sized

type family ShiftR (xMaxBits :: Nat) (x :: Nat) (bits :: Nat) :: Nat where ... Source #

Shift a type level natural to the right. This useful for division by powers of two.

Equations

ShiftR xMaxBits x n = FromBits (ShiftBitsR (ToBits x (1 + GetMostSignificantBitIndex xMaxBits x)) n) 

type family GetMostSignificantBitIndex (highestBit :: Nat) (n :: Nat) :: Nat where ... Source #

Equations

GetMostSignificantBitIndex 0 n = 1 
GetMostSignificantBitIndex highestBit n = If ((2 ^ (highestBit + 1)) <=? n) (TypeError (((Text "number to big: " :<>: ShowType n) :<>: Text " >= ") :<>: ShowType (2 ^ (highestBit + 1)))) (If ((2 ^ highestBit) <=? n) highestBit (GetMostSignificantBitIndex (highestBit - 1) n)) 

type family ShiftBitsR (bits :: [Bool]) (n :: Nat) :: [Bool] where ... Source #

Equations

ShiftBitsR bits 0 = bits 
ShiftBitsR '[] n = '[] 
ShiftBitsR '[e] 1 = '[] 
ShiftBitsR (e ': rest) 1 = e ': ShiftBitsR rest 1 
ShiftBitsR (e ': rest) n = ShiftBitsR (ShiftBitsR (e ': rest) 1) (n - 1) 

type family FromBits_ (bits :: [Bool]) (acc :: Nat) :: Nat where ... Source #

Equations

FromBits_ '[] acc = acc 
FromBits_ (False ': rest) acc = FromBits_ rest (acc + acc) 
FromBits_ (True ': rest) acc = FromBits_ rest ((1 + acc) + acc) 

type FromBits bits = FromBits_ bits 0 Source #

type family ToBitsInner (highBitSet :: Bool) (x :: Nat) (n :: Nat) (started :: Bool) :: [Bool] where ... Source #

Equations

ToBitsInner True x n started = True ': ToBits_ (x - (2 ^ n)) n True 
ToBitsInner False x n False = ToBits_ x n False 
ToBitsInner False x n True = False ': ToBits_ x n True 

type family ToBits_ (x :: Nat) (n :: Nat) (started :: Bool) :: [Bool] where ... Source #

Equations

ToBits_ x 0 started = '[] 
ToBits_ x n started = ToBitsInner (TestHighBit x (n - 1)) x (n - 1) started 

type ToBits x n = ToBits_ x n False Source #

type family TestHighBit (x :: Nat) (n :: Nat) :: Bool where ... Source #

Equations

TestHighBit x n = (2 ^ n) <=? x 

type ModPow2Bits = 32 Source #

Maximum number of bits an argument x of ModPow2 may occupy.

type family TakeLastNImplTakeNRev (n :: Nat) (rs :: [t]) (acc :: [t]) :: [t] where ... Source #

Equations

TakeLastNImplTakeNRev n '[] acc = acc 
TakeLastNImplTakeNRev 0 rs acc = acc 
TakeLastNImplTakeNRev n (r ': rs) acc = TakeLastNImplTakeNRev (n - 1) rs (r ': acc) 

type family TakeLastNImplRev (n :: Nat) (xs :: [t]) (acc :: [t]) :: [t] where ... Source #

Equations

TakeLastNImplRev n '[] acc = TakeLastNImplTakeNRev n acc '[] 
TakeLastNImplRev n (x ': xs) acc = TakeLastNImplRev n xs (x ': acc) 

type TakeLastN n xs = TakeLastNImplRev n xs '[] Source #

type ModPow2 value power = FromBits (TakeLastN power (ToBits value ModPow2Bits)) Source #

Efficient Mod operation for power of 2 values. Note that x must be representable by ModPow2Bits bits.

type family CountElementsForLengthIn (xs :: k) :: Nat Source #

Instances
type CountElementsForLengthIn ([] :: [k]) Source # 
Instance details

Defined in Data.Type.BitRecords.Assert

type CountElementsForLengthIn ([] :: [k]) = 0
type CountElementsForLengthIn (x ': xs :: [a]) Source # 
Instance details

Defined in Data.Type.BitRecords.Assert

data LengthIn :: Nat -> Nat -> Assertion a Source #

Assert that a list's length falls into a given range. This is generalized from actual lists; everything with a CountElementsForLengthIn instance can be asserted.

Instances
type Check (LengthIn from to :: TyFun k (Maybe ErrorMessage) -> Type) (xs :: k) Source # 
Instance details

Defined in Data.Type.BitRecords.Assert

type Check (LengthIn from to :: TyFun k (Maybe ErrorMessage) -> Type) (xs :: k) = Check (NatIn from to) (CountElementsForLengthIn xs)

data NatIn :: Nat -> Nat -> Assertion Nat Source #

Assert that a Nat is in a specific range.

Instances
type Check (NatIn from to :: TyFun Nat (Maybe ErrorMessage) -> Type) (n :: Nat) Source # 
Instance details

Defined in Data.Type.BitRecords.Assert

type Check (NatIn from to :: TyFun Nat (Maybe ErrorMessage) -> Type) (n :: Nat)

data NatLE :: Nat -> Assertion Nat Source #

Assert that a Nat is less than or equal to an other Nat.

Instances
type Check (NatLE n :: TyFun Nat (Maybe ErrorMessage) -> Type) (x :: Nat) Source # 
Instance details

Defined in Data.Type.BitRecords.Assert

type Check (NatLE n :: TyFun Nat (Maybe ErrorMessage) -> Type) (x :: Nat) = If (x <=? n) (Nothing :: Maybe ErrorMessage) (Just ((Text "Natural too big: " :<>: ShowType x) :$$: (Text "Required: <=" :<>: ShowType n)))

data NatGE :: Nat -> Assertion Nat Source #

Assert that a Nat is greater than or equal to an other Nat.

Instances
type Check (NatGE n :: TyFun Nat (Maybe ErrorMessage) -> Type) (x :: Nat) Source # 
Instance details

Defined in Data.Type.BitRecords.Assert

type Check (NatGE n :: TyFun Nat (Maybe ErrorMessage) -> Type) (x :: Nat) = If (n <=? x) (Nothing :: Maybe ErrorMessage) (Just ((Text "Natural too small: " :<>: ShowType x) :$$: (Text "Required: >=" :<>: ShowType n)))

data (@&&) :: Assertion a -> Assertion a -> Assertion a Source #

Assert that two assertions both hold

Instances
type Check (a1 @&& a2 :: TyFun (Maybe ErrorMessage) (Maybe ErrorMessage) -> Type) (x :: Maybe ErrorMessage) Source # 
Instance details

Defined in Data.Type.BitRecords.Assert

type Check (a1 @&& a2 :: TyFun (Maybe ErrorMessage) (Maybe ErrorMessage) -> Type) (x :: Maybe ErrorMessage)

type family Check (f :: Assertion a) (x :: a) :: Maybe ErrorMessage Source #

Apply Assertions to the actual values.

Instances
type Check (NatLE n :: TyFun Nat (Maybe ErrorMessage) -> Type) (x :: Nat) Source # 
Instance details

Defined in Data.Type.BitRecords.Assert

type Check (NatLE n :: TyFun Nat (Maybe ErrorMessage) -> Type) (x :: Nat) = If (x <=? n) (Nothing :: Maybe ErrorMessage) (Just ((Text "Natural too big: " :<>: ShowType x) :$$: (Text "Required: <=" :<>: ShowType n)))
type Check (NatGE n :: TyFun Nat (Maybe ErrorMessage) -> Type) (x :: Nat) Source # 
Instance details

Defined in Data.Type.BitRecords.Assert

type Check (NatGE n :: TyFun Nat (Maybe ErrorMessage) -> Type) (x :: Nat) = If (n <=? x) (Nothing :: Maybe ErrorMessage) (Just ((Text "Natural too small: " :<>: ShowType x) :$$: (Text "Required: >=" :<>: ShowType n)))
type Check (NatIn from to :: TyFun Nat (Maybe ErrorMessage) -> Type) (n :: Nat) Source # 
Instance details

Defined in Data.Type.BitRecords.Assert

type Check (NatIn from to :: TyFun Nat (Maybe ErrorMessage) -> Type) (n :: Nat)
type Check (LengthIn from to :: TyFun k (Maybe ErrorMessage) -> Type) (xs :: k) Source # 
Instance details

Defined in Data.Type.BitRecords.Assert

type Check (LengthIn from to :: TyFun k (Maybe ErrorMessage) -> Type) (xs :: k) = Check (NatIn from to) (CountElementsForLengthIn xs)
type Check (a1 @&& a2 :: TyFun (Maybe ErrorMessage) (Maybe ErrorMessage) -> Type) (x :: Maybe ErrorMessage) Source # 
Instance details

Defined in Data.Type.BitRecords.Assert

type Check (a1 @&& a2 :: TyFun (Maybe ErrorMessage) (Maybe ErrorMessage) -> Type) (x :: Maybe ErrorMessage)

type Assertion a = TyFun a (Maybe ErrorMessage) -> Type Source #

Make an assertion by creating a phantom data type which contains TyFun a (Maybe ErrorMessage) as last parameter. Check is used by Assert the apply the TyFuns which are specialized in this definition to have the return type Maybe ErrorMessage.

type family Assert (cond :: Assertion a) (x :: a) :: a where ... Source #

Apply an Assertion to some value and return that value if the assertion holds, otherwise throw a TypeError.

Equations

Assert cond x = ProcessCheckResult (Check cond x) x 

type (?::) x cond = Assert cond x infixr 0 Source #

Assert that a given type satisfies some condition defined via Check instances. This is only an alias for Assert

type family KnownChunkSize (s :: Nat) :: Constraint where ... Source #

Equations

KnownChunkSize size = (KnownNat size, size <= BitStringMaxLength) 

data BitStringBuilderChunk Source #

A buffer for 64 bits, such that the bits are written MSB to LSB.

type TwoFields = "f0" @: Field m .+. "f1" @: Field n

Writes: MSB LSB Bit: |k .. k-(m+1)|k-m .. k-(m+n+1)|k-(m+n) .. 0| Value: |------f0------|--------f1--------|XXXXXXXXXXXXXX|

Where k is the current bit offset. The input values are expected to be in the order of the fields, i.e.:

toFunction $ bitStringBuilderHoley (Proxy :: Proxy TwoFields) 1 2

Will result in: MSB LSB Bit: |k .. k-(m+1)|k-m .. k-(m+n+1)| k-(m+n) .. 0| Value: |0 .. 1|0 .. 10| X .. X|

data BitString Source #

A string of bits with a given length (but always <= bitStringMaxLength. The number of bits must be smaller that bitStringMaxLength.

type family ModuloBitStringMaxLength (len :: Nat) :: Nat where ... Source #

Calculate the modulus of a number and the BitStringMaxLength.

type BitStringMaxLength = 64 Source #

The maximum number of bits a BitBuffer can hold.

bitStringMaxLength :: Num a => a Source #

The maximum number of bits a BitBuffer can hold.

bitStringMaxLengthBytes :: Word64 Source #

The maximum number of bytes a BitBuffer can hold.

bitString :: Int -> Word64 -> BitString Source #

Create a BitString containing len bits from LSB to MSB, properly masked, such that only len least significant bits are kept..

bitStringBuilderChunk :: Word64 -> Int -> BitStringBuilderChunk Source #

Create a BitStringBuilderChunk containing len bits from LSB to MSB, properly masked, such that only len least significant bits are kept..

bitStringProxyLength :: KnownChunkSize n => Proxy n -> Word64 -> BitString Source #

Create a BitStringBuilderChunk with a length given by a Proxy to a type level Nat.

bufferBits Source #

Arguments

:: BitString

The value to write (in the lower length bits).

-> BitStringBuilderChunk

The input to write to

-> (BitString, BitStringBuilderChunk)

The remaining bits that did not fit in the buffer and the output buffer.

Copy bits starting at a specific offset from one a the the other. Set bits starting from the most significant bit to the least. For example writeBits m 1 <> writeBits n 2 would result in:

        MSB                                             LSB
   Bit: |k  ..  k-(m+1)|k-m  ..  k-(m+n+1)| k-(m+n)  ..  0|
 Value: |0     ..     1|0        ..     10|  ...          |
         ->             ->                 ->     (direction of writing)

type family PrettyCustomFieldValue (rt :: Type) (st :: Type) (size :: Nat) (v :: st) :: PrettyType Source #

Instances
type PrettyCustomFieldValue ASizedString ASizedString s (sr :: ASizedString) Source # 
Instance details

Defined in Data.Type.BitRecords.SizedString

type PrettyCustomFieldValue (EnumValue e) e size (v :: e) Source # 
Instance details

Defined in Data.Type.BitRecords.Enum

type PrettyCustomFieldValue (EnumValue e) e size (v :: e) = (PutNat (FromEnum e v) <+> ("hex" <:> PutHex (FromEnum e v))) <+> ("bin" <:> PutBits (FromEnum e v))

type family PrettyFieldValue (t :: BitField (rt :: Type) (st :: Type) (size :: Nat)) (v :: st) :: PrettyType where ... Source #

Equations

PrettyFieldValue MkFieldFlag True = PutStr "yes" 
PrettyFieldValue MkFieldFlag False = PutStr "no" 
PrettyFieldValue (MkFieldBits :: BitField (B (s :: Nat)) Nat s) v = PrettyNat PrettyUnpadded (PrettyPrecision s) PrettyBit v <+> PrettyParens (("hex" <:> PutHex v) <+> ("dec" <:> PutNat v)) 
PrettyFieldValue MkFieldU8 v = ("hex" <:> PutHex8 v) <+> PrettyParens ("dec" <:> PutNat v) 
PrettyFieldValue MkFieldU16 v = ("hex" <:> PutHex16 v) <+> PrettyParens ("dec" <:> PutNat v) 
PrettyFieldValue MkFieldU32 v = ("hex" <:> PutHex32 v) <+> PrettyParens ("dec" <:> PutNat v) 
PrettyFieldValue MkFieldU64 v = ("hex" <:> PutHex64 v) <+> PrettyParens ("dec" <:> PutNat v) 
PrettyFieldValue MkFieldI8 (PositiveNat v) = ("hex" <:> (PutStr "+" <++> PutHex8 v)) <+> PrettyParens ("dec" <:> (PutStr "+" <++> PutNat v)) 
PrettyFieldValue MkFieldI16 (PositiveNat v) = ("hex" <:> (PutStr "+" <++> PutHex16 v)) <+> PrettyParens ("dec" <:> (PutStr "+" <++> PutNat v)) 
PrettyFieldValue MkFieldI32 (PositiveNat v) = ("hex" <:> (PutStr "+" <++> PutHex32 v)) <+> PrettyParens ("dec" <:> (PutStr "+" <++> PutNat v)) 
PrettyFieldValue MkFieldI64 (PositiveNat v) = ("hex" <:> (PutStr "+" <++> PutHex64 v)) <+> PrettyParens ("dec" <:> (PutStr "+" <++> PutNat v)) 
PrettyFieldValue MkFieldI8 (NegativeNat v) = ("hex" <:> (PutStr "-" <++> PutHex8 v)) <+> PrettyParens ("dec" <:> (PutStr "-" <++> PutNat v)) 
PrettyFieldValue MkFieldI16 (NegativeNat v) = ("hex" <:> (PutStr "-" <++> PutHex16 v)) <+> PrettyParens ("dec" <:> (PutStr "-" <++> PutNat v)) 
PrettyFieldValue MkFieldI32 (NegativeNat v) = ("hex" <:> (PutStr "-" <++> PutHex32 v)) <+> PrettyParens ("dec" <:> (PutStr "-" <++> PutNat v)) 
PrettyFieldValue MkFieldI64 (NegativeNat v) = ("hex" <:> (PutStr "-" <++> PutHex64 v)) <+> PrettyParens ("dec" <:> (PutStr "-" <++> PutNat v)) 
PrettyFieldValue (MkFieldCustom :: BitField rt ct size) v = PrettyCustomFieldValue rt ct size v 

type family PrettyField (f :: IsA (BitRecordField (t :: BitField (rt :: Type) (st :: Type) (size :: Nat)))) :: PrettyType where ... Source #

type family BitRecordFieldSize (x :: IsA (BitRecordField t)) where ... Source #

Calculate the size as a number of bits from a BitRecordField

Equations

BitRecordFieldSize (x :: IsA (BitRecordField (t :: BitField rt st size))) = size 

data RecordField :: IsA (BitRecordField t) -> IsA BitRecord Source #

Instances
type Eval (RecordField f :: A BitRecord -> Type) Source # 
Instance details

Defined in Data.Type.BitRecords.Core

data MaybeField :: Maybe (IsA (BitRecordField t)) -> IsA BitRecord Source #

An optional field in a bit record

Instances
type Eval (MaybeField (Nothing :: Maybe (IsA (BitRecordField t))) :: A BitRecord -> Type) Source # 
Instance details

Defined in Data.Type.BitRecords.Core

type Eval (MaybeField (Just fld) :: A BitRecord -> Type) Source # 
Instance details

Defined in Data.Type.BitRecords.Core

type family FlagNothing (a :: Maybe (v :: Type)) :: IsA (BitRecordField MkFieldFlag) where ... Source #

A Flag (1-bit) that is true if the type level maybe is Nothing.

type family FlagJust (a :: Maybe (v :: Type)) :: IsA (BitRecordField MkFieldFlag) where ... Source #

A Flag (1-bit) that is true if the type level maybe is Just.

data SignedNat where Source #

A signed field value.

Constructors

PositiveNat :: Nat -> SignedNat 
NegativeNat :: Nat -> SignedNat 
Instances
BitStringBuilderHoley (Proxy (MkField MkFieldI8)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

Associated Types

type ToBitStringBuilder (Proxy (MkField MkFieldI8)) a :: Type Source #

BitStringBuilderHoley (Proxy (MkField MkFieldI16)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

Associated Types

type ToBitStringBuilder (Proxy (MkField MkFieldI16)) a :: Type Source #

BitStringBuilderHoley (Proxy (MkField MkFieldI32)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

Associated Types

type ToBitStringBuilder (Proxy (MkField MkFieldI32)) a :: Type Source #

BitStringBuilderHoley (Proxy (MkField MkFieldI64)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

Associated Types

type ToBitStringBuilder (Proxy (MkField MkFieldI64)) a :: Type Source #

(KnownNat v, BitStringBuilderHoley (Proxy f) a, ToBitStringBuilder (Proxy f) a ~ (x -> a), Num x) => BitStringBuilderHoley (Proxy (f := NegativeNat v)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

Associated Types

type ToBitStringBuilder (Proxy (f := NegativeNat v)) a :: Type Source #

(KnownNat v, BitStringBuilderHoley (Proxy f) a, ToBitStringBuilder (Proxy f) a ~ (x -> a), Num x) => BitStringBuilderHoley (Proxy (f := PositiveNat v)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

Associated Types

type ToBitStringBuilder (Proxy (f := PositiveNat v)) a :: Type Source #

type ToBitStringBuilder (Proxy (MkField MkFieldI8)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

type ToBitStringBuilder (Proxy (MkField MkFieldI16)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

type ToBitStringBuilder (Proxy (MkField MkFieldI32)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

type ToBitStringBuilder (Proxy (MkField MkFieldI64)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

type ToBitStringBuilder (Proxy (f := NegativeNat v)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

type ToBitStringBuilder (Proxy (f := PositiveNat v)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

newtype B (size :: Nat) Source #

A data type for Field and MkFieldBits, that is internally a Word64. It carries the number of relevant bits in its type.

Constructors

B 

Fields

Instances
Bounded (B size) Source # 
Instance details

Defined in Data.Type.BitRecords.Core

Methods

minBound :: B size #

maxBound :: B size #

Enum (B size) Source # 
Instance details

Defined in Data.Type.BitRecords.Core

Methods

succ :: B size -> B size #

pred :: B size -> B size #

toEnum :: Int -> B size #

fromEnum :: B size -> Int #

enumFrom :: B size -> [B size] #

enumFromThen :: B size -> B size -> [B size] #

enumFromTo :: B size -> B size -> [B size] #

enumFromThenTo :: B size -> B size -> B size -> [B size] #

Eq (B size) Source # 
Instance details

Defined in Data.Type.BitRecords.Core

Methods

(==) :: B size -> B size -> Bool #

(/=) :: B size -> B size -> Bool #

Integral (B size) Source # 
Instance details

Defined in Data.Type.BitRecords.Core

Methods

quot :: B size -> B size -> B size #

rem :: B size -> B size -> B size #

div :: B size -> B size -> B size #

mod :: B size -> B size -> B size #

quotRem :: B size -> B size -> (B size, B size) #

divMod :: B size -> B size -> (B size, B size) #

toInteger :: B size -> Integer #

Num (B size) Source # 
Instance details

Defined in Data.Type.BitRecords.Core

Methods

(+) :: B size -> B size -> B size #

(-) :: B size -> B size -> B size #

(*) :: B size -> B size -> B size #

negate :: B size -> B size #

abs :: B size -> B size #

signum :: B size -> B size #

fromInteger :: Integer -> B size #

Ord (B size) Source # 
Instance details

Defined in Data.Type.BitRecords.Core

Methods

compare :: B size -> B size -> Ordering #

(<) :: B size -> B size -> Bool #

(<=) :: B size -> B size -> Bool #

(>) :: B size -> B size -> Bool #

(>=) :: B size -> B size -> Bool #

max :: B size -> B size -> B size #

min :: B size -> B size -> B size #

Read (B size) Source # 
Instance details

Defined in Data.Type.BitRecords.Core

Methods

readsPrec :: Int -> ReadS (B size) #

readList :: ReadS [B size] #

readPrec :: ReadPrec (B size) #

readListPrec :: ReadPrec [B size] #

Real (B size) Source # 
Instance details

Defined in Data.Type.BitRecords.Core

Methods

toRational :: B size -> Rational #

Show (B size) Source # 
Instance details

Defined in Data.Type.BitRecords.Core

Methods

showsPrec :: Int -> B size -> ShowS #

show :: B size -> String #

showList :: [B size] -> ShowS #

(PrintfArg Word64, n <= 64) => PrintfArg (B n) Source # 
Instance details

Defined in Data.Type.BitRecords.Core

Bits (B size) Source # 
Instance details

Defined in Data.Type.BitRecords.Core

Methods

(.&.) :: B size -> B size -> B size #

(.|.) :: B size -> B size -> B size #

xor :: B size -> B size -> B size #

complement :: B size -> B size #

shift :: B size -> Int -> B size #

rotate :: B size -> Int -> B size #

zeroBits :: B size #

bit :: Int -> B size #

setBit :: B size -> Int -> B size #

clearBit :: B size -> Int -> B size #

complementBit :: B size -> Int -> B size #

testBit :: B size -> Int -> Bool #

bitSizeMaybe :: B size -> Maybe Int #

bitSize :: B size -> Int #

isSigned :: B size -> Bool #

shiftL :: B size -> Int -> B size #

unsafeShiftL :: B size -> Int -> B size #

shiftR :: B size -> Int -> B size #

unsafeShiftR :: B size -> Int -> B size #

rotateL :: B size -> Int -> B size #

rotateR :: B size -> Int -> B size #

popCount :: B size -> Int #

FiniteBits (B size) Source # 
Instance details

Defined in Data.Type.BitRecords.Core

Methods

finiteBitSize :: B size -> Int #

countLeadingZeros :: B size -> Int #

countTrailingZeros :: B size -> Int #

KnownChunkSize s => BitStringBuilderHoley (Proxy (MkField (MkFieldBits :: BitField (B s) Nat s))) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

Associated Types

type ToBitStringBuilder (Proxy (MkField MkFieldBits)) a :: Type Source #

type ToBitStringBuilder (Proxy (MkField (MkFieldBits :: BitField (B s) Nat s))) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

type ToBitStringBuilder (Proxy (MkField (MkFieldBits :: BitField (B s) Nat s))) a = B s -> a

data BitField (runtimeRep :: Type) (staticRep :: k) (bitCount :: Nat) where Source #

Types of this kind define the basic type of a BitRecordField. Sure, this could have been an open type, but really, how many actual useful field types exist? Well, from a global perspective, uncountable infinite, but the focus of this library is to blast out bits over the network, using usual Haskell libraries, and hence, there is actually only very little reason to differentiate types of record fields, other than what low-level library function to apply and how to pretty print the field.

data (:=) :: forall st (t :: BitField rt st size). IsA (BitRecordField t) -> st -> IsA (BitRecordField t) infixl 7 Source #

A field with a value set at compile time.

Instances
(KnownNat v, BitStringBuilderHoley (Proxy f) a, ToBitStringBuilder (Proxy f) a ~ (rt -> a), Num rt) => BitStringBuilderHoley (Proxy (f := v)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

Associated Types

type ToBitStringBuilder (Proxy (f := v)) a :: Type Source #

(KnownNat v, BitStringBuilderHoley (Proxy f) a, ToBitStringBuilder (Proxy f) a ~ (x -> a), Num x) => BitStringBuilderHoley (Proxy (f := NegativeNat v)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

Associated Types

type ToBitStringBuilder (Proxy (f := NegativeNat v)) a :: Type Source #

(KnownNat v, BitStringBuilderHoley (Proxy f) a, ToBitStringBuilder (Proxy f) a ~ (x -> a), Num x) => BitStringBuilderHoley (Proxy (f := PositiveNat v)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

Associated Types

type ToBitStringBuilder (Proxy (f := PositiveNat v)) a :: Type Source #

BitRecordFieldSize f ~ 1 => BitStringBuilderHoley (Proxy (f := False)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

Associated Types

type ToBitStringBuilder (Proxy (f := False)) a :: Type Source #

BitRecordFieldSize f ~ 1 => BitStringBuilderHoley (Proxy (f := True)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

Associated Types

type ToBitStringBuilder (Proxy (f := True)) a :: Type Source #

(KnownNat (FromEnum e v), KnownChunkSize size) => BitStringBuilderHoley (Proxy (f := v)) r Source # 
Instance details

Defined in Data.Type.BitRecords.Enum

Associated Types

type ToBitStringBuilder (Proxy (f := v)) r :: Type Source #

type ToBitStringBuilder (Proxy (f := NegativeNat v)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

type ToBitStringBuilder (Proxy (f := PositiveNat v)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

type ToBitStringBuilder (Proxy (f := v)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

type ToBitStringBuilder (Proxy (f := v)) a = a
type ToBitStringBuilder (Proxy (f := False)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

type ToBitStringBuilder (Proxy (f := False)) a = a
type ToBitStringBuilder (Proxy (f := True)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

type ToBitStringBuilder (Proxy (f := True)) a = a
type ToBitStringBuilder (Proxy (f := v)) r Source # 
Instance details

Defined in Data.Type.BitRecords.Enum

type ToBitStringBuilder (Proxy (f := v)) r = r
type SizeFieldValue (f := v :: A (BitRecordField t) -> Type) Source # 
Instance details

Defined in Data.Type.BitRecords.Sized

type (@:) (l :: Symbol) (f :: IsA (BitRecordField (t :: BitField rt (st :: stk) size))) = (LabelF l f :: IsA (BitRecordField t)) infixr 8 Source #

A field with a label assigned to it.

data LabelF :: Symbol -> IsA (BitRecordField t) -> IsA (BitRecordField t) Source #

A bit record field with a number of bits

Instances
BitStringBuilderHoley (Proxy nested) a => BitStringBuilderHoley (Proxy (LabelF l nested)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

Associated Types

type ToBitStringBuilder (Proxy (LabelF l nested)) a :: Type Source #

type ToBitStringBuilder (Proxy (LabelF l nested)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

type ToBitStringBuilder (Proxy (LabelF l nested)) a = ToBitStringBuilder (Proxy nested) a
type SizeFieldValue (LabelF l f :: A (BitRecordField t) -> Type) Source # 
Instance details

Defined in Data.Type.BitRecords.Sized

data MkField t :: IsA (BitRecordField t) Source #

A bit record field with a number of bits

Instances
BitStringBuilderHoley (Proxy (MkField MkFieldFlag)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

Associated Types

type ToBitStringBuilder (Proxy (MkField MkFieldFlag)) a :: Type Source #

BitStringBuilderHoley (Proxy (MkField MkFieldI8)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

Associated Types

type ToBitStringBuilder (Proxy (MkField MkFieldI8)) a :: Type Source #

BitStringBuilderHoley (Proxy (MkField MkFieldI16)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

Associated Types

type ToBitStringBuilder (Proxy (MkField MkFieldI16)) a :: Type Source #

BitStringBuilderHoley (Proxy (MkField MkFieldI32)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

Associated Types

type ToBitStringBuilder (Proxy (MkField MkFieldI32)) a :: Type Source #

BitStringBuilderHoley (Proxy (MkField MkFieldI64)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

Associated Types

type ToBitStringBuilder (Proxy (MkField MkFieldI64)) a :: Type Source #

BitStringBuilderHoley (Proxy (MkField MkFieldU8)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

Associated Types

type ToBitStringBuilder (Proxy (MkField MkFieldU8)) a :: Type Source #

BitStringBuilderHoley (Proxy (MkField MkFieldU16)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

Associated Types

type ToBitStringBuilder (Proxy (MkField MkFieldU16)) a :: Type Source #

BitStringBuilderHoley (Proxy (MkField MkFieldU32)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

Associated Types

type ToBitStringBuilder (Proxy (MkField MkFieldU32)) a :: Type Source #

BitStringBuilderHoley (Proxy (MkField MkFieldU64)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

Associated Types

type ToBitStringBuilder (Proxy (MkField MkFieldU64)) a :: Type Source #

KnownChunkSize s => BitStringBuilderHoley (Proxy (MkField (MkFieldBits :: BitField (B s) Nat s))) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

Associated Types

type ToBitStringBuilder (Proxy (MkField MkFieldBits)) a :: Type Source #

KnownChunkSize size => BitStringBuilderHoley (Proxy (MkField (MkFieldCustom :: BitField (EnumValue e) e size))) r Source # 
Instance details

Defined in Data.Type.BitRecords.Enum

Associated Types

type ToBitStringBuilder (Proxy (MkField MkFieldCustom)) r :: Type Source #

type ToBitStringBuilder (Proxy (MkField MkFieldFlag)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

type ToBitStringBuilder (Proxy (MkField MkFieldI8)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

type ToBitStringBuilder (Proxy (MkField MkFieldI16)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

type ToBitStringBuilder (Proxy (MkField MkFieldI32)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

type ToBitStringBuilder (Proxy (MkField MkFieldI64)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

type ToBitStringBuilder (Proxy (MkField MkFieldU8)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

type ToBitStringBuilder (Proxy (MkField MkFieldU16)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

type ToBitStringBuilder (Proxy (MkField MkFieldU32)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

type ToBitStringBuilder (Proxy (MkField MkFieldU64)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

type ToBitStringBuilder (Proxy (MkField (MkFieldBits :: BitField (B s) Nat s))) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

type ToBitStringBuilder (Proxy (MkField (MkFieldBits :: BitField (B s) Nat s))) a = B s -> a
type ToBitStringBuilder (Proxy (MkField (MkFieldCustom :: BitField (EnumValue e) e size))) r Source # 
Instance details

Defined in Data.Type.BitRecords.Enum

type SizeFieldValue (MkField t :: A (BitRecordField t) -> Type) Source # 
Instance details

Defined in Data.Type.BitRecords.Sized

type SizeFieldValue (MkField t :: A (BitRecordField t) -> Type) = size

data BitRecordField :: BitField rt st len -> Type Source #

A family of bit fields.

A bit field always has a size, i.e. the number of bits it uses, as well as a term level value type and a type level value type. It also has an optional label, and an optional value assigned to it.

Instances
BitStringBuilderHoley (Proxy (MkField MkFieldFlag)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

Associated Types

type ToBitStringBuilder (Proxy (MkField MkFieldFlag)) a :: Type Source #

BitStringBuilderHoley (Proxy (MkField MkFieldI8)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

Associated Types

type ToBitStringBuilder (Proxy (MkField MkFieldI8)) a :: Type Source #

BitStringBuilderHoley (Proxy (MkField MkFieldI16)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

Associated Types

type ToBitStringBuilder (Proxy (MkField MkFieldI16)) a :: Type Source #

BitStringBuilderHoley (Proxy (MkField MkFieldI32)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

Associated Types

type ToBitStringBuilder (Proxy (MkField MkFieldI32)) a :: Type Source #

BitStringBuilderHoley (Proxy (MkField MkFieldI64)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

Associated Types

type ToBitStringBuilder (Proxy (MkField MkFieldI64)) a :: Type Source #

BitStringBuilderHoley (Proxy (MkField MkFieldU8)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

Associated Types

type ToBitStringBuilder (Proxy (MkField MkFieldU8)) a :: Type Source #

BitStringBuilderHoley (Proxy (MkField MkFieldU16)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

Associated Types

type ToBitStringBuilder (Proxy (MkField MkFieldU16)) a :: Type Source #

BitStringBuilderHoley (Proxy (MkField MkFieldU32)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

Associated Types

type ToBitStringBuilder (Proxy (MkField MkFieldU32)) a :: Type Source #

BitStringBuilderHoley (Proxy (MkField MkFieldU64)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

Associated Types

type ToBitStringBuilder (Proxy (MkField MkFieldU64)) a :: Type Source #

(KnownNat v, BitStringBuilderHoley (Proxy f) a, ToBitStringBuilder (Proxy f) a ~ (rt -> a), Num rt) => BitStringBuilderHoley (Proxy (f := v)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

Associated Types

type ToBitStringBuilder (Proxy (f := v)) a :: Type Source #

(KnownNat v, BitStringBuilderHoley (Proxy f) a, ToBitStringBuilder (Proxy f) a ~ (x -> a), Num x) => BitStringBuilderHoley (Proxy (f := NegativeNat v)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

Associated Types

type ToBitStringBuilder (Proxy (f := NegativeNat v)) a :: Type Source #

(KnownNat v, BitStringBuilderHoley (Proxy f) a, ToBitStringBuilder (Proxy f) a ~ (x -> a), Num x) => BitStringBuilderHoley (Proxy (f := PositiveNat v)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

Associated Types

type ToBitStringBuilder (Proxy (f := PositiveNat v)) a :: Type Source #

BitRecordFieldSize f ~ 1 => BitStringBuilderHoley (Proxy (f := False)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

Associated Types

type ToBitStringBuilder (Proxy (f := False)) a :: Type Source #

BitRecordFieldSize f ~ 1 => BitStringBuilderHoley (Proxy (f := True)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

Associated Types

type ToBitStringBuilder (Proxy (f := True)) a :: Type Source #

BitStringBuilderHoley (Proxy nested) a => BitStringBuilderHoley (Proxy (LabelF l nested)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

Associated Types

type ToBitStringBuilder (Proxy (LabelF l nested)) a :: Type Source #

KnownChunkSize s => BitStringBuilderHoley (Proxy (MkField (MkFieldBits :: BitField (B s) Nat s))) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

Associated Types

type ToBitStringBuilder (Proxy (MkField MkFieldBits)) a :: Type Source #

KnownChunkSize size => BitStringBuilderHoley (Proxy (MkField (MkFieldCustom :: BitField (EnumValue e) e size))) r Source # 
Instance details

Defined in Data.Type.BitRecords.Enum

Associated Types

type ToBitStringBuilder (Proxy (MkField MkFieldCustom)) r :: Type Source #

(KnownNat (FromEnum e v), KnownChunkSize size) => BitStringBuilderHoley (Proxy (f := v)) r Source # 
Instance details

Defined in Data.Type.BitRecords.Enum

Associated Types

type ToBitStringBuilder (Proxy (f := v)) r :: Type Source #

type Eval (MaybeField (Nothing :: Maybe (IsA (BitRecordField t))) :: A BitRecord -> Type) Source # 
Instance details

Defined in Data.Type.BitRecords.Core

type Eval (MaybeField (Just fld) :: A BitRecord -> Type) Source # 
Instance details

Defined in Data.Type.BitRecords.Core

type ToPretty (f :: IsA (BitRecordField t)) Source # 
Instance details

Defined in Data.Type.BitRecords.Core

type ToBitStringBuilder (Proxy (MkField MkFieldFlag)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

type ToBitStringBuilder (Proxy (MkField MkFieldI8)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

type ToBitStringBuilder (Proxy (MkField MkFieldI16)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

type ToBitStringBuilder (Proxy (MkField MkFieldI32)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

type ToBitStringBuilder (Proxy (MkField MkFieldI64)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

type ToBitStringBuilder (Proxy (MkField MkFieldU8)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

type ToBitStringBuilder (Proxy (MkField MkFieldU16)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

type ToBitStringBuilder (Proxy (MkField MkFieldU32)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

type ToBitStringBuilder (Proxy (MkField MkFieldU64)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

type ToBitStringBuilder (Proxy (f := NegativeNat v)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

type ToBitStringBuilder (Proxy (f := PositiveNat v)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

type ToBitStringBuilder (Proxy (f := v)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

type ToBitStringBuilder (Proxy (f := v)) a = a
type ToBitStringBuilder (Proxy (f := False)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

type ToBitStringBuilder (Proxy (f := False)) a = a
type ToBitStringBuilder (Proxy (f := True)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

type ToBitStringBuilder (Proxy (f := True)) a = a
type ToBitStringBuilder (Proxy (LabelF l nested)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

type ToBitStringBuilder (Proxy (LabelF l nested)) a = ToBitStringBuilder (Proxy nested) a
type ToBitStringBuilder (Proxy (MkField (MkFieldBits :: BitField (B s) Nat s))) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

type ToBitStringBuilder (Proxy (MkField (MkFieldBits :: BitField (B s) Nat s))) a = B s -> a
type ToBitStringBuilder (Proxy (MkField (MkFieldCustom :: BitField (EnumValue e) e size))) r Source # 
Instance details

Defined in Data.Type.BitRecords.Enum

type ToBitStringBuilder (Proxy (f := v)) r Source # 
Instance details

Defined in Data.Type.BitRecords.Enum

type ToBitStringBuilder (Proxy (f := v)) r = r
type SizeFieldValue (MkField t :: A (BitRecordField t) -> Type) Source # 
Instance details

Defined in Data.Type.BitRecords.Sized

type SizeFieldValue (MkField t :: A (BitRecordField t) -> Type) = size
type SizeFieldValue (f := v :: A (BitRecordField t) -> Type) Source # 
Instance details

Defined in Data.Type.BitRecords.Sized

type SizeFieldValue (LabelF l f :: A (BitRecordField t) -> Type) Source # 
Instance details

Defined in Data.Type.BitRecords.Sized

data OptionalRecord :: Maybe BitRecord -> IsA BitRecord Source #

Either use the value from Just or return a EmptyBitRecord value(types(kinds))

Instances
type Eval (OptionalRecord (Nothing :: Maybe BitRecord)) Source # 
Instance details

Defined in Data.Type.BitRecords.Core

type Eval (OptionalRecord (Just t) :: A BitRecord -> Type) Source # 
Instance details

Defined in Data.Type.BitRecords.Core

type Eval (OptionalRecord (Just t) :: A BitRecord -> Type) = t

data BitRecordOfList (f :: IsA (foo :-> BitRecord)) (xs :: [foo]) :: IsA BitRecord Source #

Let type level lists also be records

Instances
type Eval (BitRecordOfList f xs :: A BitRecord -> Type) Source # 
Instance details

Defined in Data.Type.BitRecords.Core

type family RecArrayToBitRecord (r :: BitRecord) (n :: Nat) :: BitRecord where ... Source #

Repeat a bit record n times.

type (^^) r n = RecArray r n infixl 5 Source #

data RecArray :: BitRecord -> Nat -> IsA BitRecord Source #

An array of records with a fixed number of elements, NOTE: this type is actually not really necessary since ReplicateRecord exists, but this allows to have a different showRecord output.

Instances
type Eval (RecArray r n :: A BitRecord -> Type) Source # 
Instance details

Defined in Data.Type.BitRecords.Core

data RuntimeFieldValue (label :: Symbol) :: IsA (FieldValue label staticRep) Source #

data StaticFieldValue (label :: Symbol) :: staticRep -> IsA (FieldValue label staticRep) Source #

data FieldValue :: Symbol -> staticRep -> Type Source #

The field value parameter for :~, either a static, compile time, value or a dynamic, runtime value.

type family (fld :: IsA (BitRecordField (t :: BitField (rt :: Type) (st :: k) (len :: Nat)))) :+? (value :: Maybe (IsA (FieldValue (label :: Symbol) st))) :: BitRecord where ... infixl 7 Source #

Like :~ but for a Maybe parameter. In case of Just it behaves like :~ in case of Nothing it return an EmptyBitRecord.

Equations

fld :+? (Just v) = BitRecordMember (fld :~ v) 
fld :+? Nothing = EmptyBitRecord 

type family (fld :: IsA (BitRecordField (t :: BitField (rt :: Type) (st :: k) (len :: Nat)))) :~? (value :: Maybe (IsA (FieldValue (label :: Symbol) st))) :: IsA BitRecord where ... infixl 7 Source #

Like :~ but for a Maybe parameter. In case of Just it behaves like :~ in case of Nothing it return an EmptyBitRecord.

Equations

fld :~? (Just v) = RecordField (fld :~ v) 
fld :~? Nothing = Pure EmptyBitRecord 

type family (field :: IsA (BitRecordField (t :: BitField (rt :: Type) (st :: k) (len :: Nat)))) :~ (value :: IsA (FieldValue (label :: Symbol) st)) :: IsA (BitRecordField t) where ... infixl 7 Source #

Set a field to either a static, compile time, value or a dynamic, runtime value.

Equations

fld :~ (StaticFieldValue l v) = (l @: fld) := v 
fld :~ (RuntimeFieldValue l) = l @: fld 

type (.+.) (l :: IsA (BitRecordField t1)) (r :: IsA (BitRecordField t2)) = Append (BitRecordMember l) (BitRecordMember r) infixr 6 Source #

Append a BitRecordField and a BitRecordField forming a BitRecord with two members.

type (.+:) (f :: IsA (BitRecordField t1)) (r :: BitRecord) = Append (BitRecordMember f) r infixr 6 Source #

Append a BitRecordField and a BitRecord

type (:+.) (r :: BitRecord) (f :: IsA (BitRecordField t1)) = Append r (BitRecordMember f) infixl 6 Source #

Append a BitRecord and a BitRecordField

type family Append (l :: BitRecord) (r :: BitRecord) :: BitRecord where ... Source #

type (:+:) (l :: BitRecord) (r :: BitRecord) = (l `Append` r :: BitRecord) infixl 3 Source #

Combine two BitRecords to form a new BitRecord. If the parameters are not of type BitRecord they will be converted.

data (l :: IsA BitRecord) :^+ (r :: BitRecord) :: IsA BitRecord infixl 3 Source #

Combine two BitRecords to form a new BitRecord. If the parameters are not of type BitRecord they will be converted.

Instances
type Eval (l :^+ r :: A BitRecord -> Type) Source # 
Instance details

Defined in Data.Type.BitRecords.Core

type Eval (l :^+ r :: A BitRecord -> Type) = Append (Eval l) r

data (l :: BitRecord) :+^ (r :: IsA BitRecord) :: IsA BitRecord infixl 3 Source #

Combine two BitRecords to form a new BitRecord. If the parameters are not of type BitRecord they will be converted.

Instances
type Eval (l :+^ r :: A BitRecord -> Type) Source # 
Instance details

Defined in Data.Type.BitRecords.Core

type Eval (l :+^ r :: A BitRecord -> Type) = Append l (Eval r)

type OptionalRecordOf (f :: IsA (s :-> IsA BitRecord)) (x :: Maybe s) = (Optional (Pure EmptyBitRecord) f $~ x :: IsA BitRecord) Source #

Either use the value from Just or return a EmptyBitRecord value(types(kinds))

type family BitRecordMemberCount (b :: BitRecord) :: Nat where ... Source #

Get the total number of members in a record.

type family WhenR (b :: Bool) (x :: BitRecord) :: BitRecord where ... Source #

A conditional BitRecord

Equations

WhenR False r = EmptyBitRecord 
WhenR True r = r 

data BitRecord where Source #

BitRecordFields assembly

Instances
BitStringBuilderHoley (Proxy (Eval r)) a => BitStringBuilderHoley (Proxy r) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

Associated Types

type ToBitStringBuilder (Proxy r) a :: Type Source #

BitStringBuilderHoley (Proxy EmptyBitRecord) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

Associated Types

type ToBitStringBuilder (Proxy EmptyBitRecord) a :: Type Source #

BitStringBuilderHoley (Proxy f) a => BitStringBuilderHoley (Proxy (BitRecordMember f)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

Associated Types

type ToBitStringBuilder (Proxy (BitRecordMember f)) a :: Type Source #

(BitStringBuilderHoley (Proxy l) (ToBitStringBuilder (Proxy r) a), BitStringBuilderHoley (Proxy r) a) => BitStringBuilderHoley (Proxy (BitRecordAppend l r)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

Associated Types

type ToBitStringBuilder (Proxy (BitRecordAppend l r)) a :: Type Source #

type ToPretty (rec :: BitRecord) Source # 
Instance details

Defined in Data.Type.BitRecords.Core

type ToPretty (rec :: BitRecord) = PrettyRecord rec
type SizeFieldValue (b :: BitRecord) Source # 
Instance details

Defined in Data.Type.BitRecords.Sized

type (BitRecordAppendFun_ l :: A (BitRecord :-> BitRecord) -> Type) $~ (r :: BitRecord) Source # 
Instance details

Defined in Data.Type.BitRecords.Core

type Eval (OptionalRecord (Nothing :: Maybe BitRecord)) Source # 
Instance details

Defined in Data.Type.BitRecords.Core

type Eval (OptionalRecord (Just t) :: A BitRecord -> Type) Source # 
Instance details

Defined in Data.Type.BitRecords.Core

type Eval (OptionalRecord (Just t) :: A BitRecord -> Type) = t
type Eval (StaticExpandableContent record :: A BitRecord -> Type) Source # 
Instance details

Defined in Data.ByteString.Mp4.Boxes.Expandable

type Eval (RecArray r n :: A BitRecord -> Type) Source # 
Instance details

Defined in Data.Type.BitRecords.Core

type Eval (l :^+ r :: A BitRecord -> Type) Source # 
Instance details

Defined in Data.Type.BitRecords.Core

type Eval (l :^+ r :: A BitRecord -> Type) = Append (Eval l) r
type Eval (l :+^ r :: A BitRecord -> Type) Source # 
Instance details

Defined in Data.Type.BitRecords.Core

type Eval (l :+^ r :: A BitRecord -> Type) = Append l (Eval r)
type (BitRecordOfDescriptor :: A (Descriptor tag :-> BitRecord) -> Type) $~ (MkDescriptor body :: Descriptor tag) Source # 
Instance details

Defined in Data.ByteString.Mp4.Boxes.BaseDescriptor

type Eval (BitRecordOfList f xs :: A BitRecord -> Type) Source # 
Instance details

Defined in Data.Type.BitRecords.Core

type Eval (Sized sf r :: A BitRecord -> Type) Source # 
Instance details

Defined in Data.Type.BitRecords.Sized

type Eval (Sized sf r :: A BitRecord -> Type) = (("size" @: sf) := SizeFieldValue r) .+: r
type Eval (RecordField f :: A BitRecord -> Type) Source # 
Instance details

Defined in Data.Type.BitRecords.Core

type Eval (MaybeField (Nothing :: Maybe (IsA (BitRecordField t))) :: A BitRecord -> Type) Source # 
Instance details

Defined in Data.Type.BitRecords.Core

type Eval (MaybeField (Just fld) :: A BitRecord -> Type) Source # 
Instance details

Defined in Data.Type.BitRecords.Core

type Eval (SizedField sf r :: A BitRecord -> Type) Source # 
Instance details

Defined in Data.Type.BitRecords.Sized

type Eval (SizedField sf r :: A BitRecord -> Type) = (("size" @: sf) := SizeFieldValue r) .+. r
type ToBitStringBuilder (Proxy r) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

type ToBitStringBuilder (Proxy EmptyBitRecord) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

type ToBitStringBuilder (Proxy (BitRecordMember f)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

type ToBitStringBuilder (Proxy (BitRecordAppend l r)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

getRecordSizeFromProxy :: forall px (rec :: BitRecord). KnownNat (BitRecordSize rec) => px rec -> Integer Source #

Get the size of the record.

showARecord :: forall proxy (rec :: IsA BitRecord). PrettyTypeShow (PrettyRecord (Eval rec)) => proxy rec -> String Source #

Render rec to a pretty, human readable form. Internally this is a wrapper around ptShow using PrettyRecord.

showRecord :: forall proxy (rec :: BitRecord). PrettyTypeShow (PrettyRecord rec) => proxy rec -> String Source #

Render rec to a pretty, human readable form. Internally this is a wrapper around ptShow using PrettyRecord.

class BitStringBuilderHoley a r where Source #

Associated Types

type ToBitStringBuilder a r Source #

Instances
BitStringBuilderHoley BitString r Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

Associated Types

type ToBitStringBuilder BitString r :: Type Source #

BitStringBuilderHoley (Proxy (MkField MkFieldFlag)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

Associated Types

type ToBitStringBuilder (Proxy (MkField MkFieldFlag)) a :: Type Source #

BitStringBuilderHoley (Proxy (MkField MkFieldI8)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

Associated Types

type ToBitStringBuilder (Proxy (MkField MkFieldI8)) a :: Type Source #

BitStringBuilderHoley (Proxy (MkField MkFieldI16)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

Associated Types

type ToBitStringBuilder (Proxy (MkField MkFieldI16)) a :: Type Source #

BitStringBuilderHoley (Proxy (MkField MkFieldI32)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

Associated Types

type ToBitStringBuilder (Proxy (MkField MkFieldI32)) a :: Type Source #

BitStringBuilderHoley (Proxy (MkField MkFieldI64)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

Associated Types

type ToBitStringBuilder (Proxy (MkField MkFieldI64)) a :: Type Source #

BitStringBuilderHoley (Proxy (MkField MkFieldU8)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

Associated Types

type ToBitStringBuilder (Proxy (MkField MkFieldU8)) a :: Type Source #

BitStringBuilderHoley (Proxy (MkField MkFieldU16)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

Associated Types

type ToBitStringBuilder (Proxy (MkField MkFieldU16)) a :: Type Source #

BitStringBuilderHoley (Proxy (MkField MkFieldU32)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

Associated Types

type ToBitStringBuilder (Proxy (MkField MkFieldU32)) a :: Type Source #

BitStringBuilderHoley (Proxy (MkField MkFieldU64)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

Associated Types

type ToBitStringBuilder (Proxy (MkField MkFieldU64)) a :: Type Source #

(KnownNat v, BitStringBuilderHoley (Proxy f) a, ToBitStringBuilder (Proxy f) a ~ (rt -> a), Num rt) => BitStringBuilderHoley (Proxy (f := v)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

Associated Types

type ToBitStringBuilder (Proxy (f := v)) a :: Type Source #

(KnownNat v, BitStringBuilderHoley (Proxy f) a, ToBitStringBuilder (Proxy f) a ~ (x -> a), Num x) => BitStringBuilderHoley (Proxy (f := NegativeNat v)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

Associated Types

type ToBitStringBuilder (Proxy (f := NegativeNat v)) a :: Type Source #

(KnownNat v, BitStringBuilderHoley (Proxy f) a, ToBitStringBuilder (Proxy f) a ~ (x -> a), Num x) => BitStringBuilderHoley (Proxy (f := PositiveNat v)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

Associated Types

type ToBitStringBuilder (Proxy (f := PositiveNat v)) a :: Type Source #

BitRecordFieldSize f ~ 1 => BitStringBuilderHoley (Proxy (f := False)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

Associated Types

type ToBitStringBuilder (Proxy (f := False)) a :: Type Source #

BitRecordFieldSize f ~ 1 => BitStringBuilderHoley (Proxy (f := True)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

Associated Types

type ToBitStringBuilder (Proxy (f := True)) a :: Type Source #

BitStringBuilderHoley (Proxy nested) a => BitStringBuilderHoley (Proxy (LabelF l nested)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

Associated Types

type ToBitStringBuilder (Proxy (LabelF l nested)) a :: Type Source #

KnownChunkSize s => BitStringBuilderHoley (Proxy (MkField (MkFieldBits :: BitField (B s) Nat s))) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

Associated Types

type ToBitStringBuilder (Proxy (MkField MkFieldBits)) a :: Type Source #

KnownChunkSize size => BitStringBuilderHoley (Proxy (MkField (MkFieldCustom :: BitField (EnumValue e) e size))) r Source # 
Instance details

Defined in Data.Type.BitRecords.Enum

Associated Types

type ToBitStringBuilder (Proxy (MkField MkFieldCustom)) r :: Type Source #

(KnownNat (FromEnum e v), KnownChunkSize size) => BitStringBuilderHoley (Proxy (f := v)) r Source # 
Instance details

Defined in Data.Type.BitRecords.Enum

Associated Types

type ToBitStringBuilder (Proxy (f := v)) r :: Type Source #

BitStringBuilderHoley (Proxy (Eval r)) a => BitStringBuilderHoley (Proxy r) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

Associated Types

type ToBitStringBuilder (Proxy r) a :: Type Source #

BitStringBuilderHoley (Proxy EmptyBitRecord) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

Associated Types

type ToBitStringBuilder (Proxy EmptyBitRecord) a :: Type Source #

BitStringBuilderHoley (Proxy f) a => BitStringBuilderHoley (Proxy (BitRecordMember f)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

Associated Types

type ToBitStringBuilder (Proxy (BitRecordMember f)) a :: Type Source #

(BitStringBuilderHoley (Proxy l) (ToBitStringBuilder (Proxy r) a), BitStringBuilderHoley (Proxy r) a) => BitStringBuilderHoley (Proxy (BitRecordAppend l r)) a Source # 
Instance details

Defined in Data.Type.BitRecords.Builder.LazyByteStringBuilder

Associated Types

type ToBitStringBuilder (Proxy (BitRecordAppend l r)) a :: Type Source #

bitBuilderBox :: forall (record :: BitRecord). BitStringBuilderHoley (Proxy record) BuilderBox => Proxy record -> ToBitStringBuilder (Proxy record) BuilderBox Source #

Create a Builder from a BitRecord and store it in a BuilderBox

wrapBitBuilderBox :: forall (record :: BitRecord) wrapped. BitStringBuilderHoley (Proxy record) wrapped => (BuilderBox -> wrapped) -> Proxy record -> ToBitStringBuilder (Proxy record) wrapped Source #

Like bitBuilderBox, but toFunction the result and accept as an additional parameter a wrapper function to wrap the final result (the BuilderBox) and toFunction the whole machiner.

bitBuilderBoxHoley :: forall (record :: BitRecord) r. BitStringBuilderHoley (Proxy record) r => Proxy record -> FunctionBuilder BuilderBox r (ToBitStringBuilder (Proxy record) r) Source #

Create a Builder from a BitRecord and store it in a BuilderBox; return a FunctionBuilder monoid that does that on toFunction

flushBitStringBuilder :: BitStringBuilderState -> BitStringBuilderState Source #

Write the partial buffer contents using any number of word8 The unwritten parts of the bittr buffer are at the top. If the

    63  ...  (63-off-1)(63-off)  ...  0
    ^^^^^^^^^^^^^^^^^^^
Relevant bits start to the top!

appendBitString :: BitString -> BitStringBuilder Source #

Write all the bits, in chunks, filling and writing the BitString in the BitStringBuilderState as often as necessary.

appendStrictByteString :: ByteString -> BitStringBuilder Source #

Write all the b*y*tes, into the BitStringBuilderState this allows general purposes non-byte aligned builders.

printBuilder :: Builder -> String Source #

Print a Builder to a space seperated series of hexa-decimal bytes.

data EnumValue e where Source #

An enum value supplied at runtime.

Constructors

MkEnumValue :: KnownNat (FromEnum e v) => Proxy (v :: e) -> EnumValue e 
Instances
KnownChunkSize size => BitStringBuilderHoley (Proxy (MkField (MkFieldCustom :: BitField (EnumValue e) e size))) r Source # 
Instance details

Defined in Data.Type.BitRecords.Enum

Associated Types

type ToBitStringBuilder (Proxy (MkField MkFieldCustom)) r :: Type Source #

(KnownNat (FromEnum e v), KnownChunkSize size) => BitStringBuilderHoley (Proxy (f := v)) r Source # 
Instance details

Defined in Data.Type.BitRecords.Enum

Associated Types

type ToBitStringBuilder (Proxy (f := v)) r :: Type Source #

type PrettyCustomFieldValue (EnumValue e) e size (v :: e) Source # 
Instance details

Defined in Data.Type.BitRecords.Enum

type PrettyCustomFieldValue (EnumValue e) e size (v :: e) = (PutNat (FromEnum e v) <+> ("hex" <:> PutHex (FromEnum e v))) <+> ("bin" <:> PutBits (FromEnum e v))
type ToPretty (EnumValue e :: Type) Source # 
Instance details

Defined in Data.Type.BitRecords.Enum

type ToPretty (EnumValue e :: Type) = PutStr "<<enum>>"
type ToBitStringBuilder (Proxy (MkField (MkFieldCustom :: BitField (EnumValue e) e size))) r Source # 
Instance details

Defined in Data.Type.BitRecords.Enum

type ToBitStringBuilder (Proxy (f := v)) r Source # 
Instance details

Defined in Data.Type.BitRecords.Enum

type ToBitStringBuilder (Proxy (f := v)) r = r

type family FromEnum enum (entry :: enum) :: Nat Source #

Return the numeric index of an entry in a table. This emulates fromEnum a bit.

Instances
type FromEnum StreamType ObjectDescriptorStream Source # 
Instance details

Defined in Data.ByteString.Mp4.Boxes.DecoderSpecificInfo

type FromEnum StreamType ClockReferenceStream Source # 
Instance details

Defined in Data.ByteString.Mp4.Boxes.DecoderSpecificInfo

type FromEnum StreamType SceneDescriptionStream_Iso14496_11 Source # 
Instance details

Defined in Data.ByteString.Mp4.Boxes.DecoderSpecificInfo

type FromEnum StreamType VisualStream Source # 
Instance details

Defined in Data.ByteString.Mp4.Boxes.DecoderSpecificInfo

type FromEnum StreamType AudioStream Source # 
Instance details

Defined in Data.ByteString.Mp4.Boxes.DecoderSpecificInfo

type FromEnum StreamType Mpeg7Stream Source # 
Instance details

Defined in Data.ByteString.Mp4.Boxes.DecoderSpecificInfo

type FromEnum StreamType IpmpStream Source # 
Instance details

Defined in Data.ByteString.Mp4.Boxes.DecoderSpecificInfo

type FromEnum StreamType ObjectContentInfoStream Source # 
Instance details

Defined in Data.ByteString.Mp4.Boxes.DecoderSpecificInfo

type FromEnum StreamType MpegJStream Source # 
Instance details

Defined in Data.ByteString.Mp4.Boxes.DecoderSpecificInfo

type FromEnum StreamType InteractionStream Source # 
Instance details

Defined in Data.ByteString.Mp4.Boxes.DecoderSpecificInfo

type FromEnum StreamType IpmpToolStream_Iso14496_13 Source # 
Instance details

Defined in Data.ByteString.Mp4.Boxes.DecoderSpecificInfo

type FromEnum ObjectTypeIndication SystemsIso14496_1_a Source # 
Instance details

Defined in Data.ByteString.Mp4.Boxes.DecoderSpecificInfo

type FromEnum ObjectTypeIndication SystemsIso14496_1_b Source # 
Instance details

Defined in Data.ByteString.Mp4.Boxes.DecoderSpecificInfo

type FromEnum ObjectTypeIndication InteractionStreamObjInd Source # 
Instance details

Defined in Data.ByteString.Mp4.Boxes.DecoderSpecificInfo

type FromEnum ObjectTypeIndication SystemsIso14496_1_ExtendedBifs Source # 
Instance details

Defined in Data.ByteString.Mp4.Boxes.DecoderSpecificInfo

type FromEnum ObjectTypeIndication SystemsIso14496_1_Afx Source # 
Instance details

Defined in Data.ByteString.Mp4.Boxes.DecoderSpecificInfo

type FromEnum ObjectTypeIndication FontDataStream Source # 
Instance details

Defined in Data.ByteString.Mp4.Boxes.DecoderSpecificInfo

type FromEnum ObjectTypeIndication SynthesizedTextureStream Source # 
Instance details

Defined in Data.ByteString.Mp4.Boxes.DecoderSpecificInfo

type FromEnum ObjectTypeIndication StreamingTextStream Source # 
Instance details

Defined in Data.ByteString.Mp4.Boxes.DecoderSpecificInfo

type FromEnum ObjectTypeIndication VisualIso14496_2 Source # 
Instance details

Defined in Data.ByteString.Mp4.Boxes.DecoderSpecificInfo

type FromEnum ObjectTypeIndication VisualH264 Source # 
Instance details

Defined in Data.ByteString.Mp4.Boxes.DecoderSpecificInfo

type FromEnum ObjectTypeIndication VisualH264ParameterSets Source # 
Instance details

Defined in Data.ByteString.Mp4.Boxes.DecoderSpecificInfo

type FromEnum ObjectTypeIndication AudioIso14496_3 Source # 
Instance details

Defined in Data.ByteString.Mp4.Boxes.DecoderSpecificInfo

type FromEnum ObjectTypeIndication VisualIso13818_2_SimpleProfile Source # 
Instance details

Defined in Data.ByteString.Mp4.Boxes.DecoderSpecificInfo

type FromEnum ObjectTypeIndication VisualIso13818_2_MainProfile Source # 
Instance details

Defined in Data.ByteString.Mp4.Boxes.DecoderSpecificInfo

type FromEnum ObjectTypeIndication VisualIso13818_2_SnrProfile Source # 
Instance details

Defined in Data.ByteString.Mp4.Boxes.DecoderSpecificInfo

type FromEnum ObjectTypeIndication VisualIso13818_2_SpatialProfile Source # 
Instance details

Defined in Data.ByteString.Mp4.Boxes.DecoderSpecificInfo

type FromEnum ObjectTypeIndication VisualIso13818_2_HighProfile Source # 
Instance details

Defined in Data.ByteString.Mp4.Boxes.DecoderSpecificInfo

type FromEnum ObjectTypeIndication VisualIso13818_2_422Profile Source # 
Instance details

Defined in Data.ByteString.Mp4.Boxes.DecoderSpecificInfo

type FromEnum ObjectTypeIndication AudioIso13818_7_MainProfile Source # 
Instance details

Defined in Data.ByteString.Mp4.Boxes.DecoderSpecificInfo

type FromEnum ObjectTypeIndication AudioIso13818_7_LowComplexityProfile Source # 
Instance details

Defined in Data.ByteString.Mp4.Boxes.DecoderSpecificInfo

type FromEnum ObjectTypeIndication AudioIso13818_7_ScalableSamplingRateProfile Source # 
Instance details

Defined in Data.ByteString.Mp4.Boxes.DecoderSpecificInfo

type FromEnum ObjectTypeIndication AudioIso13818_3 Source # 
Instance details

Defined in Data.ByteString.Mp4.Boxes.DecoderSpecificInfo

type FromEnum ObjectTypeIndication VisualIso11172_2 Source # 
Instance details

Defined in Data.ByteString.Mp4.Boxes.DecoderSpecificInfo

type FromEnum ObjectTypeIndication AudioIso11172_3 Source # 
Instance details

Defined in Data.ByteString.Mp4.Boxes.DecoderSpecificInfo

type FromEnum ObjectTypeIndication VisualIso10918_1 Source # 
Instance details

Defined in Data.ByteString.Mp4.Boxes.DecoderSpecificInfo

type FromEnum ObjectTypeIndication VisualIso15444_1 Source # 
Instance details

Defined in Data.ByteString.Mp4.Boxes.DecoderSpecificInfo

type FromEnum ObjectTypeIndication NoObjectTypeSpecified Source # 
Instance details

Defined in Data.ByteString.Mp4.Boxes.DecoderSpecificInfo

type FromEnum ChannelConfigTable GasChannelConfig Source # 
Instance details

Defined in Data.ByteString.Mp4.Boxes.AudioSpecificConfig

type FromEnum ChannelConfigTable SingleChannel Source # 
Instance details

Defined in Data.ByteString.Mp4.Boxes.AudioSpecificConfig

type FromEnum ChannelConfigTable ChannelPair Source # 
Instance details

Defined in Data.ByteString.Mp4.Boxes.AudioSpecificConfig

type FromEnum ChannelConfigTable SinglePair Source # 
Instance details

Defined in Data.ByteString.Mp4.Boxes.AudioSpecificConfig

type FromEnum ChannelConfigTable SinglePairSingle Source # 
Instance details

Defined in Data.ByteString.Mp4.Boxes.AudioSpecificConfig

type FromEnum ChannelConfigTable SinglePairPair Source # 
Instance details

Defined in Data.ByteString.Mp4.Boxes.AudioSpecificConfig

type FromEnum ChannelConfigTable SinglePairPairLfe Source # 
Instance details

Defined in Data.ByteString.Mp4.Boxes.AudioSpecificConfig

type FromEnum ChannelConfigTable SinglePairPairPairLfe Source # 
Instance details

Defined in Data.ByteString.Mp4.Boxes.AudioSpecificConfig

type FromEnum SamplingFreqTable SF96000 Source # 
Instance details

Defined in Data.ByteString.Mp4.Boxes.AudioSpecificConfig

type FromEnum SamplingFreqTable SF88200 Source # 
Instance details

Defined in Data.ByteString.Mp4.Boxes.AudioSpecificConfig

type FromEnum SamplingFreqTable SF64000 Source # 
Instance details

Defined in Data.ByteString.Mp4.Boxes.AudioSpecificConfig

type FromEnum SamplingFreqTable SF48000 Source # 
Instance details

Defined in Data.ByteString.Mp4.Boxes.AudioSpecificConfig

type FromEnum SamplingFreqTable SF44100 Source # 
Instance details

Defined in Data.ByteString.Mp4.Boxes.AudioSpecificConfig

type FromEnum SamplingFreqTable SF32000 Source # 
Instance details

Defined in Data.ByteString.Mp4.Boxes.AudioSpecificConfig

type FromEnum SamplingFreqTable SF24000 Source # 
Instance details

Defined in Data.ByteString.Mp4.Boxes.AudioSpecificConfig

type FromEnum SamplingFreqTable SF22050 Source # 
Instance details

Defined in Data.ByteString.Mp4.Boxes.AudioSpecificConfig

type FromEnum SamplingFreqTable SF16000 Source # 
Instance details

Defined in Data.ByteString.Mp4.Boxes.AudioSpecificConfig

type FromEnum SamplingFreqTable SF12000 Source # 
Instance details

Defined in Data.ByteString.Mp4.Boxes.AudioSpecificConfig

type FromEnum SamplingFreqTable SF11025 Source # 
Instance details

Defined in Data.ByteString.Mp4.Boxes.AudioSpecificConfig

type FromEnum SamplingFreqTable SF8000 Source # 
Instance details

Defined in Data.ByteString.Mp4.Boxes.AudioSpecificConfig

type FromEnum SamplingFreqTable SF7350 Source # 
Instance details

Defined in Data.ByteString.Mp4.Boxes.AudioSpecificConfig

type FromEnum SamplingFreqTable SFReserved1 Source # 
Instance details

Defined in Data.ByteString.Mp4.Boxes.AudioSpecificConfig

type FromEnum SamplingFreqTable SFReserved2 Source # 
Instance details

Defined in Data.ByteString.Mp4.Boxes.AudioSpecificConfig

type FromEnum SamplingFreqTable SFCustom Source # 
Instance details

Defined in Data.ByteString.Mp4.Boxes.AudioSpecificConfig

type FromEnum AudioObjectTypeId AacMain Source # 
Instance details

Defined in Data.ByteString.Mp4.Boxes.AudioSpecificConfig

type FromEnum AudioObjectTypeId AacLc Source # 
Instance details

Defined in Data.ByteString.Mp4.Boxes.AudioSpecificConfig

type FromEnum AudioObjectTypeId AacSsr Source # 
Instance details

Defined in Data.ByteString.Mp4.Boxes.AudioSpecificConfig

type FromEnum AudioObjectTypeId AacLtp Source # 
Instance details

Defined in Data.ByteString.Mp4.Boxes.AudioSpecificConfig

type FromEnum AudioObjectTypeId Sbr Source # 
Instance details

Defined in Data.ByteString.Mp4.Boxes.AudioSpecificConfig

type FromEnum AudioObjectTypeId AacScalable Source # 
Instance details

Defined in Data.ByteString.Mp4.Boxes.AudioSpecificConfig

type FromEnum AudioObjectTypeId TwinVq Source # 
Instance details

Defined in Data.ByteString.Mp4.Boxes.AudioSpecificConfig

type FromEnum AudioObjectTypeId Celp Source # 
Instance details

Defined in Data.ByteString.Mp4.Boxes.AudioSpecificConfig

type FromEnum AudioObjectTypeId Hvxc Source # 
Instance details

Defined in Data.ByteString.Mp4.Boxes.AudioSpecificConfig

type FromEnum AudioObjectTypeId AoReserved1 Source # 
Instance details

Defined in Data.ByteString.Mp4.Boxes.AudioSpecificConfig

type FromEnum AudioObjectTypeId AoReserved2 Source # 
Instance details

Defined in Data.ByteString.Mp4.Boxes.AudioSpecificConfig

type FromEnum AudioObjectTypeId Ttsi Source # 
Instance details

Defined in Data.ByteString.Mp4.Boxes.AudioSpecificConfig

type FromEnum AudioObjectTypeId MainSunthetic Source # 
Instance details

Defined in Data.ByteString.Mp4.Boxes.AudioSpecificConfig

type FromEnum AudioObjectTypeId WavetableSynthesis Source # 
Instance details

Defined in Data.ByteString.Mp4.Boxes.AudioSpecificConfig

type FromEnum AudioObjectTypeId GeneralMidi Source # 
Instance details

Defined in Data.ByteString.Mp4.Boxes.AudioSpecificConfig

type FromEnum AudioObjectTypeId AlgorithmicSynthesisAndAudioFx Source # 
Instance details

Defined in Data.ByteString.Mp4.Boxes.AudioSpecificConfig

type FromEnum AudioObjectTypeId ErAacLc Source # 
Instance details

Defined in Data.ByteString.Mp4.Boxes.AudioSpecificConfig

type FromEnum AudioObjectTypeId AoReserved3 Source # 
Instance details

Defined in Data.ByteString.Mp4.Boxes.AudioSpecificConfig

type FromEnum AudioObjectTypeId ErAacLtp Source # 
Instance details

Defined in Data.ByteString.Mp4.Boxes.AudioSpecificConfig

type FromEnum AudioObjectTypeId ErAacScalable Source # 
Instance details

Defined in Data.ByteString.Mp4.Boxes.AudioSpecificConfig

type FromEnum AudioObjectTypeId ErTwinVq Source # 
Instance details

Defined in Data.ByteString.Mp4.Boxes.AudioSpecificConfig

type FromEnum AudioObjectTypeId ErBsac Source # 
Instance details

Defined in Data.ByteString.Mp4.Boxes.AudioSpecificConfig

type FromEnum AudioObjectTypeId ErAacLd Source # 
Instance details

Defined in Data.ByteString.Mp4.Boxes.AudioSpecificConfig

type FromEnum AudioObjectTypeId ErCelp Source # 
Instance details

Defined in Data.ByteString.Mp4.Boxes.AudioSpecificConfig

type FromEnum AudioObjectTypeId ErHvxc Source # 
Instance details

Defined in Data.ByteString.Mp4.Boxes.AudioSpecificConfig

type FromEnum AudioObjectTypeId ErHiln Source # 
Instance details

Defined in Data.ByteString.Mp4.Boxes.AudioSpecificConfig

type FromEnum AudioObjectTypeId ErParametric Source # 
Instance details

Defined in Data.ByteString.Mp4.Boxes.AudioSpecificConfig

type FromEnum AudioObjectTypeId Ssc Source # 
Instance details

Defined in Data.ByteString.Mp4.Boxes.AudioSpecificConfig

type FromEnum AudioObjectTypeId AoReserved4 Source # 
Instance details

Defined in Data.ByteString.Mp4.Boxes.AudioSpecificConfig

type FromEnum AudioObjectTypeId AoReserved5 Source # 
Instance details

Defined in Data.ByteString.Mp4.Boxes.AudioSpecificConfig

type FromEnum AudioObjectTypeId AoCustom Source # 
Instance details

Defined in Data.ByteString.Mp4.Boxes.AudioSpecificConfig

type FromEnum AudioObjectTypeId AoLayer1 Source # 
Instance details

Defined in Data.ByteString.Mp4.Boxes.AudioSpecificConfig

type FromEnum AudioObjectTypeId AoLayer2 Source # 
Instance details

Defined in Data.ByteString.Mp4.Boxes.AudioSpecificConfig

type FromEnum AudioObjectTypeId AoLayer3 Source # 
Instance details

Defined in Data.ByteString.Mp4.Boxes.AudioSpecificConfig

type FromEnum AudioObjectTypeId AoDst Source # 
Instance details

Defined in Data.ByteString.Mp4.Boxes.AudioSpecificConfig

type FromEnum AudioObjectTypeId AotInvalid Source # 
Instance details

Defined in Data.ByteString.Mp4.Boxes.AudioSpecificConfig

data EnumParamAlt (label :: Symbol) (ef :: IsAn (EnumField (enum :: Type) (size :: Nat))) :: IsAn (EnumOf enum) Source #

Create an EnumOf that sets the extended enum to a runtime value.

Instances
type Eval (EnumParamAlt label (FixedEnum enum size) :: A (EnumOf enum) -> Type) Source # 
Instance details

Defined in Data.Type.BitRecords.Enum

type Eval (EnumParamAlt label (FixedEnum enum size) :: A (EnumOf enum) -> Type) = (TypeError (Text "Cannot assign an extension value to the FixedEnum " :<>: ShowType enum) :: EnumOf enum)
type Eval (EnumParamAlt label (ExtEnum enum size extInd extField) :: A (EnumOf enum) -> Type) Source # 
Instance details

Defined in Data.Type.BitRecords.Enum

type Eval (EnumParamAlt label (ExtEnum enum size extInd extField) :: A (EnumOf enum) -> Type) = MkEnumOf (ExtEnum enum size extInd extField) (StaticFieldValue label extInd) (BitRecordMember (extField :~ (RuntimeFieldValue label :: A (FieldValue label st) -> Type)))

data SetEnumAlt (l :: Symbol) (ef :: IsAn (EnumField (enum :: Type) (size :: Nat))) (v :: k) :: IsAn (EnumOf enum) Source #

Create an EnumOf that sets an extended enum to an extended static value.

Instances
type Eval (SetEnumAlt l (FixedEnum enum size) value :: A (EnumOf enum) -> Type) Source # 
Instance details

Defined in Data.Type.BitRecords.Enum

type Eval (SetEnumAlt l (FixedEnum enum size) value :: A (EnumOf enum) -> Type) = (TypeError (Text "Cannot assign an 'extended' value to the 'FixedEnum' " :<>: ShowType enum) :: EnumOf enum)
type Eval (SetEnumAlt l (ExtEnum enum size extInd extField) value :: A (EnumOf enum) -> Type) Source # 
Instance details

Defined in Data.Type.BitRecords.Enum

type Eval (SetEnumAlt l (ExtEnum enum size extInd extField) value :: A (EnumOf enum) -> Type) = MkEnumOf (ExtEnum enum size extInd extField) (StaticFieldValue l extInd) (BitRecordMember (extField := value))

data EnumParam (label :: Symbol) (ef :: IsAn (EnumField (enum :: Type) (size :: Nat))) :: IsAn (EnumOf enum) Source #

Create an EnumOf that sets the enum to a runtime value.

Instances
type Eval (EnumParam label ei :: A (EnumOf enum) -> Type) Source # 
Instance details

Defined in Data.Type.BitRecords.Enum

type Eval (EnumParam label ei :: A (EnumOf enum) -> Type) = MkEnumOf ei (RuntimeFieldValue label :: A (FieldValue label enum) -> Type) EmptyBitRecord

data SetEnum (l :: Symbol) (ef :: IsAn (EnumField enum size)) (v :: enum) :: IsAn (EnumOf enum) Source #

Create an EnumOf that sets an enum to a static value.

Instances
type Eval (SetEnum l ei value :: A (EnumOf enum) -> Type) Source # 
Instance details

Defined in Data.Type.BitRecords.Enum

type Eval (SetEnum l ei value :: A (EnumOf enum) -> Type) = MkEnumOf ei (StaticFieldValue l value) EmptyBitRecord

data ExtEnum (enum :: Type) (size :: Nat) (extInd :: enum) (extField :: IsA (BitRecordField (t :: BitField rt0 (st0 :: k0) len0))) :: IsAn (EnumField enum size) Source #

An enum that can be extended with an additional BitRecordField, following the regular enum field; the extension is optional, i.e. only if the regular field contains a special value (e.g. 0xff).

Instances
type Eval (EnumParamAlt label (ExtEnum enum size extInd extField) :: A (EnumOf enum) -> Type) Source # 
Instance details

Defined in Data.Type.BitRecords.Enum

type Eval (EnumParamAlt label (ExtEnum enum size extInd extField) :: A (EnumOf enum) -> Type) = MkEnumOf (ExtEnum enum size extInd extField) (StaticFieldValue label extInd) (BitRecordMember (extField :~ (RuntimeFieldValue label :: A (FieldValue label st) -> Type)))
type Eval (SetEnumAlt l (ExtEnum enum size extInd extField) value :: A (EnumOf enum) -> Type) Source # 
Instance details

Defined in Data.Type.BitRecords.Enum

type Eval (SetEnumAlt l (ExtEnum enum size extInd extField) value :: A (EnumOf enum) -> Type) = MkEnumOf (ExtEnum enum size extInd extField) (StaticFieldValue l extInd) (BitRecordMember (extField := value))

data FixedEnum (enum :: Type) (size :: Nat) :: IsAn (EnumField enum size) Source #

A fixed size EnumField

Instances
type Eval (EnumParamAlt label (FixedEnum enum size) :: A (EnumOf enum) -> Type) Source # 
Instance details

Defined in Data.Type.BitRecords.Enum

type Eval (EnumParamAlt label (FixedEnum enum size) :: A (EnumOf enum) -> Type) = (TypeError (Text "Cannot assign an extension value to the FixedEnum " :<>: ShowType enum) :: EnumOf enum)
type Eval (SetEnumAlt l (FixedEnum enum size) value :: A (EnumOf enum) -> Type) Source # 
Instance details

Defined in Data.Type.BitRecords.Enum

type Eval (SetEnumAlt l (FixedEnum enum size) value :: A (EnumOf enum) -> Type) = (TypeError (Text "Cannot assign an 'extended' value to the 'FixedEnum' " :<>: ShowType enum) :: EnumOf enum)

data EnumField (enum :: Type) (size :: Nat) Source #

Physical representation of an EnumOf, this is an abstract type

type family RenderEnumOf (e :: EnumOf enum) :: BitRecord where ... Source #

Equations

RenderEnumOf (MkEnumOf mainField mainFieldVal extra) = (BitRecordFieldOfEnumField mainField :~ mainFieldVal) .+: extra 

data EnumOf enum where Source #

Wrapper around a type that can be represented as a short number, indexing the clauses of the (sum) type.

Constructors

MkEnumOf :: IsAn (EnumField enum size) -> IsA (FieldValue label enum) -> BitRecord -> EnumOf enum 
Instances
type Eval (EnumParam label ei :: A (EnumOf enum) -> Type) Source # 
Instance details

Defined in Data.Type.BitRecords.Enum

type Eval (EnumParam label ei :: A (EnumOf enum) -> Type) = MkEnumOf ei (RuntimeFieldValue label :: A (FieldValue label enum) -> Type) EmptyBitRecord
type Eval (EnumParamAlt label (FixedEnum enum size) :: A (EnumOf enum) -> Type) Source # 
Instance details

Defined in Data.Type.BitRecords.Enum

type Eval (EnumParamAlt label (FixedEnum enum size) :: A (EnumOf enum) -> Type) = (TypeError (Text "Cannot assign an extension value to the FixedEnum " :<>: ShowType enum) :: EnumOf enum)
type Eval (EnumParamAlt label (ExtEnum enum size extInd extField) :: A (EnumOf enum) -> Type) Source # 
Instance details

Defined in Data.Type.BitRecords.Enum

type Eval (EnumParamAlt label (ExtEnum enum size extInd extField) :: A (EnumOf enum) -> Type) = MkEnumOf (ExtEnum enum size extInd extField) (StaticFieldValue label extInd) (BitRecordMember (extField :~ (RuntimeFieldValue label :: A (FieldValue label st) -> Type)))
type Eval (SetEnum l ei value :: A (EnumOf enum) -> Type) Source # 
Instance details

Defined in Data.Type.BitRecords.Enum

type Eval (SetEnum l ei value :: A (EnumOf enum) -> Type) = MkEnumOf ei (StaticFieldValue l value) EmptyBitRecord
type Eval (SetEnumAlt l (FixedEnum enum size) value :: A (EnumOf enum) -> Type) Source # 
Instance details

Defined in Data.Type.BitRecords.Enum

type Eval (SetEnumAlt l (FixedEnum enum size) value :: A (EnumOf enum) -> Type) = (TypeError (Text "Cannot assign an 'extended' value to the 'FixedEnum' " :<>: ShowType enum) :: EnumOf enum)
type Eval (SetEnumAlt l (ExtEnum enum size extInd extField) value :: A (EnumOf enum) -> Type) Source # 
Instance details

Defined in Data.Type.BitRecords.Enum

type Eval (SetEnumAlt l (ExtEnum enum size extInd extField) value :: A (EnumOf enum) -> Type) = MkEnumOf (ExtEnum enum size extInd extField) (StaticFieldValue l extInd) (BitRecordMember (extField := value))

enumValueProxy :: KnownNat (FromEnum e v) => Proxy (v :: e) -> EnumValue e Source #

Create an EnumValue from a Proxy. TODO remove?

type family SizeFieldValue (c :: k) :: Nat Source #

For something to be augmented by a size field there must be an instance of this family to generate the value of the size field, e.g. by counting the elements.

Instances
type SizeFieldValue (b :: BitRecord) Source # 
Instance details

Defined in Data.Type.BitRecords.Sized

type SizeFieldValue (MkField t :: A (BitRecordField t) -> Type) Source # 
Instance details

Defined in Data.Type.BitRecords.Sized

type SizeFieldValue (MkField t :: A (BitRecordField t) -> Type) = size
type SizeFieldValue (f := v :: A (BitRecordField t) -> Type) Source # 
Instance details

Defined in Data.Type.BitRecords.Sized

type SizeFieldValue (LabelF l f :: A (BitRecordField t) -> Type) Source # 
Instance details

Defined in Data.Type.BitRecords.Sized

type SizedField64 t = SizedField FieldU64 t Source #

A convenient alias for a SizedField with an FieldU64 size field.

type SizedField32 t = SizedField FieldU32 t Source #

A convenient alias for a SizedField with an FieldU32 size field.

type SizedField16 t = SizedField FieldU16 t Source #

A convenient alias for a SizedField with an FieldU16 size field.

type SizedField8 t = SizedField FieldU8 t Source #

A convenient alias for a SizedField with an FieldU8 size field.

data SizedField (sf :: IsA (BitRecordField (t :: BitField (rt :: Type) Nat (size :: Nat)))) (r :: IsA (BitRecordField (u :: BitField (rt' :: Type) (st' :: k0) (len0 :: Nat)))) :: IsA BitRecord Source #

A record with a size member, and a nested field that can be counted using SizeFieldValue.

Instances
type Eval (SizedField sf r :: A BitRecord -> Type) Source # 
Instance details

Defined in Data.Type.BitRecords.Sized

type Eval (SizedField sf r :: A BitRecord -> Type) = (("size" @: sf) := SizeFieldValue r) .+. r

type Sized64 t = Sized FieldU64 t Source #

A convenient alias for a Sized with an FieldU64 size field.

type Sized32 t = Sized FieldU32 t Source #

A convenient alias for a Sized with an FieldU32 size field.

type Sized16 t = Sized FieldU16 t Source #

A convenient alias for a Sized with an FieldU16 size field.

type Sized8 t = Sized FieldU8 t Source #

A convenient alias for a Sized with an FieldU8 size field.

data Sized (sf :: IsA (BitRecordField (t :: BitField (rt :: Type) Nat (size :: Nat)))) (r :: BitRecord) :: IsA BitRecord Source #

A record with a size member, and a nested record that can be counted using SizeFieldValue.

Instances
type Eval (Sized sf r :: A BitRecord -> Type) Source # 
Instance details

Defined in Data.Type.BitRecords.Sized

type Eval (Sized sf r :: A BitRecord -> Type) = (("size" @: sf) := SizeFieldValue r) .+: r

type SizedString str bytes = MkField (MkFieldCustom :: BitField ASizedString ASizedString (8 * bytes)) := MkASizedString str bytes Source #

A type level symbol paired with a type level length, that determines how many characters of the symbol may be used. The first parameter defines the length field.

utf8 :: QuasiQuoter Source #

Create a SizedString from a utf-8 string

Orphan instances

Default ByteString Source # 
Instance details

Methods

def :: ByteString #

Default Text Source # 
Instance details

Methods

def :: Text #

Default c => Default (Tagged s c) Source # 
Instance details

Methods

def :: Tagged s c #