indigo-0.1.0.0: Convenient imperative eDSL over Lorentz.
Safe HaskellNone
LanguageHaskell2010

Indigo.Prelude

Description

This module serves the purpose of listing hiding rules of Prelude that conflicts with Indigo exported functions.

Synopsis

Documentation

(++) :: [a] -> [a] -> [a] infixr 5 #

Append two lists, i.e.,

[x1, ..., xm] ++ [y1, ..., yn] == [x1, ..., xm, y1, ..., yn]
[x1, ..., xm] ++ [y1, ...] == [x1, ..., xm, y1, ...]

If the first list is not finite, the result is the first list.

seq :: a -> b -> b infixr 0 #

The value of seq a b is bottom if a is bottom, and otherwise equal to b. In other words, it evaluates the first argument a to weak head normal form (WHNF). seq is usually introduced to improve performance by avoiding unneeded laziness.

A note on evaluation order: the expression seq a b does not guarantee that a will be evaluated before b. The only guarantee given by seq is that the both a and b will be evaluated before seq returns a value. In particular, this means that b may be evaluated before a. If you need to guarantee a specific order of evaluation, you must use the function pseq from the "parallel" package.

filter :: (a -> Bool) -> [a] -> [a] #

O(n). filter, applied to a predicate and a list, returns the list of those elements that satisfy the predicate; i.e.,

filter p xs = [ x | x <- xs, p x]
>>> filter odd [1, 2, 3]
[1,3]

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

O(min(m,n)). zip takes two lists and returns a list of corresponding pairs.

zip [1, 2] ['a', 'b'] = [(1, 'a'), (2, 'b')]

If one input list is short, excess elements of the longer list are discarded:

zip [1] ['a', 'b'] = [(1, 'a')]
zip [1, 2] ['a'] = [(1, 'a')]

zip is right-lazy:

zip [] _|_ = []
zip _|_ [] = _|_

zip is capable of list fusion, but it is restricted to its first list argument and its resulting list.

otherwise :: Bool #

otherwise is defined as the value True. It helps to make guards more readable. eg.

 f x | x < 0     = ...
     | otherwise = ...

($) :: forall (r :: RuntimeRep) a (b :: TYPE r). (a -> b) -> a -> b infixr 0 #

Application operator. This operator is redundant, since ordinary application (f x) means the same as (f $ x). However, $ has low, right-associative binding precedence, so it sometimes allows parentheses to be omitted; for example:

f $ g $ h x  =  f (g (h x))

It is also useful in higher-order situations, such as map ($ 0) xs, or zipWith ($) fs xs.

Note that ($) is levity-polymorphic in its result type, so that foo $ True where foo :: Bool -> Int# is well-typed.

fromIntegral :: (Integral a, Num b) => a -> b #

general coercion from integral types

realToFrac :: (Real a, Fractional b) => a -> b #

general coercion to fractional types

guard :: Alternative f => Bool -> f () #

Conditional failure of Alternative computations. Defined by

guard True  = pure ()
guard False = empty

Examples

Expand

Common uses of guard include conditionally signaling an error in an error monad and conditionally rejecting the current choice in an Alternative-based parser.

As an example of signaling an error in the error monad Maybe, consider a safe division function safeDiv x y that returns Nothing when the denominator y is zero and Just (x `div` y) otherwise. For example:

>>> safeDiv 4 0
Nothing
>>> safeDiv 4 2
Just 2

A definition of safeDiv using guards, but not guard:

safeDiv :: Int -> Int -> Maybe Int
safeDiv x y | y /= 0    = Just (x `div` y)
            | otherwise = Nothing

A definition of safeDiv using guard and Monad do-notation:

safeDiv :: Int -> Int -> Maybe Int
safeDiv x y = do
  guard (y /= 0)
  return (x `div` y)

join :: Monad m => m (m a) -> m a #

The join function is the conventional monad join operator. It is used to remove one level of monadic structure, projecting its bound argument into the outer level.

Examples

Expand

A common use of join is to run an IO computation returned from an STM transaction, since STM transactions can't perform IO directly. Recall that

atomically :: STM a -> IO a

is used to run STM transactions atomically. So, by specializing the types of atomically and join to

atomically :: STM (IO b) -> IO (IO b)
join       :: IO (IO b)  -> IO b

we can compose them as

join . atomically :: STM (IO b) -> IO b

to run an STM transaction and the IO action it returns.

class Bounded a where #

The Bounded class is used to name the upper and lower limits of a type. Ord is not a superclass of Bounded since types that are not totally ordered may also have upper and lower bounds.

The Bounded class may be derived for any enumeration type; minBound is the first constructor listed in the data declaration and maxBound is the last. Bounded may also be derived for single-constructor datatypes whose constituent types are in Bounded.

Methods

minBound :: a #

maxBound :: a #

Instances

Instances details
Bounded Bool

Since: base-2.1

Instance details

Defined in GHC.Enum

Bounded Char

Since: base-2.1

Instance details

Defined in GHC.Enum

Bounded Int

Since: base-2.1

Instance details

Defined in GHC.Enum

Methods

minBound :: Int #

maxBound :: Int #

Bounded Int8

Since: base-2.1

Instance details

Defined in GHC.Int

Bounded Int16

Since: base-2.1

Instance details

Defined in GHC.Int

Bounded Int32

Since: base-2.1

Instance details

Defined in GHC.Int

Bounded Int64

Since: base-2.1

Instance details

Defined in GHC.Int

Bounded Ordering

Since: base-2.1

Instance details

Defined in GHC.Enum

Bounded Word

Since: base-2.1

Instance details

Defined in GHC.Enum

Bounded Word8

Since: base-2.1

Instance details

Defined in GHC.Word

Bounded Word16

Since: base-2.1

Instance details

Defined in GHC.Word

Bounded Word32

Since: base-2.1

Instance details

Defined in GHC.Word

Bounded Word64

Since: base-2.1

Instance details

Defined in GHC.Word

Bounded VecCount

Since: base-4.10.0.0

Instance details

Defined in GHC.Enum

Bounded VecElem

Since: base-4.10.0.0

Instance details

Defined in GHC.Enum

Bounded ()

Since: base-2.1

Instance details

Defined in GHC.Enum

Methods

minBound :: () #

maxBound :: () #

Bounded All

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Methods

minBound :: All #

maxBound :: All #

Bounded Any

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Methods

minBound :: Any #

maxBound :: Any #

Bounded Associativity

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Bounded SourceUnpackedness

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Bounded SourceStrictness

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Bounded DecidedStrictness

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Bounded UTF32_Invalid 
Instance details

Defined in Basement.String.Encoding.UTF32

Methods

minBound :: UTF32_Invalid #

maxBound :: UTF32_Invalid #

Bounded Encoding 
Instance details

Defined in Basement.String

Bounded Extension 
Instance details

Defined in GHC.LanguageExtensions.Type

Bounded Mutez 
Instance details

Defined in Tezos.Core

Bounded KeyHashTag 
Instance details

Defined in Tezos.Crypto

Bounded EntriesOrder 
Instance details

Defined in Michelson.Untyped.Contract

Bounded Undefined 
Instance details

Defined in Universum.Debug

Class () (Bounded a) 
Instance details

Defined in Data.Constraint

Methods

cls :: Bounded a :- () #

a :=> (Bounded (Dict a)) 
Instance details

Defined in Data.Constraint

Methods

ins :: a :- Bounded (Dict a) #

() :=> (Bounded Bool) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Bounded Bool #

() :=> (Bounded Char) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Bounded Char #

() :=> (Bounded Int) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Bounded Int #

() :=> (Bounded Ordering) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Bounded Ordering #

() :=> (Bounded Word) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Bounded Word #

() :=> (Bounded ()) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Bounded () #

Bounded a => Bounded (Min a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

minBound :: Min a #

maxBound :: Min a #

Bounded a => Bounded (Max a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

minBound :: Max a #

maxBound :: Max a #

Bounded a => Bounded (First a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

minBound :: First a #

maxBound :: First a #

Bounded a => Bounded (Last a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

minBound :: Last a #

maxBound :: Last a #

Bounded m => Bounded (WrappedMonoid m)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Bounded a => Bounded (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

Bounded a => Bounded (Dual a)

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Methods

minBound :: Dual a #

maxBound :: Dual a #

Bounded a => Bounded (Sum a)

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Methods

minBound :: Sum a #

maxBound :: Sum a #

Bounded a => Bounded (Product a)

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

a => Bounded (Dict a) 
Instance details

Defined in Data.Constraint

Methods

minBound :: Dict a #

maxBound :: Dict a #

(Bounded a) :=> (Bounded (Identity a)) 
Instance details

Defined in Data.Constraint

Methods

ins :: Bounded a :- Bounded (Identity a) #

(Bounded a) :=> (Bounded (Const a b)) 
Instance details

Defined in Data.Constraint

Methods

ins :: Bounded a :- Bounded (Const a b) #

(Bounded a, Bounded b) => Bounded (a, b)

Since: base-2.1

Instance details

Defined in GHC.Enum

Methods

minBound :: (a, b) #

maxBound :: (a, b) #

Bounded (Proxy t)

Since: base-4.7.0.0

Instance details

Defined in Data.Proxy

Methods

minBound :: Proxy t #

maxBound :: Proxy t #

(Bounded a, Bounded b) :=> (Bounded (a, b)) 
Instance details

Defined in Data.Constraint

Methods

ins :: (Bounded a, Bounded b) :- Bounded (a, b) #

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

Since: base-2.1

Instance details

Defined in GHC.Enum

Methods

minBound :: (a, b, c) #

maxBound :: (a, b, c) #

Bounded a => Bounded (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Methods

minBound :: Const a b #

maxBound :: Const a b #

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

Coercible a b => Bounded (Coercion a b)

Since: base-4.7.0.0

Instance details

Defined in Data.Type.Coercion

Methods

minBound :: Coercion a b #

maxBound :: Coercion a 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 #

Bounded b => Bounded (Tagged s b) 
Instance details

Defined in Data.Tagged

Methods

minBound :: Tagged s b #

maxBound :: Tagged s b #

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

Since: base-2.1

Instance details

Defined in GHC.Enum

Methods

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

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

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 #

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

Since: base-2.1

Instance details

Defined in GHC.Enum

Methods

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

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

(Bounded a, Bounded b, Bounded c, Bounded d, Bounded e, Bounded f) => Bounded (a, b, c, d, e, f)

Since: base-2.1

Instance details

Defined in GHC.Enum

Methods

minBound :: (a, b, c, d, e, f) #

maxBound :: (a, b, c, d, e, f) #

(Bounded a, Bounded b, Bounded c, Bounded d, Bounded e, Bounded f, Bounded g) => Bounded (a, b, c, d, e, f, g)

Since: base-2.1

Instance details

Defined in GHC.Enum

Methods

minBound :: (a, b, c, d, e, f, g) #

maxBound :: (a, b, c, d, e, f, g) #

(Bounded a, Bounded b, Bounded c, Bounded d, Bounded e, Bounded f, Bounded g, Bounded h) => Bounded (a, b, c, d, e, f, g, h)

Since: base-2.1

Instance details

Defined in GHC.Enum

Methods

minBound :: (a, b, c, d, e, f, g, h) #

maxBound :: (a, b, c, d, e, f, g, h) #

(Bounded a, Bounded b, Bounded c, Bounded d, Bounded e, Bounded f, Bounded g, Bounded h, Bounded i) => Bounded (a, b, c, d, e, f, g, h, i)

Since: base-2.1

Instance details

Defined in GHC.Enum

Methods

minBound :: (a, b, c, d, e, f, g, h, i) #

maxBound :: (a, b, c, d, e, f, g, h, i) #

(Bounded a, Bounded b, Bounded c, Bounded d, Bounded e, Bounded f, Bounded g, Bounded h, Bounded i, Bounded j) => Bounded (a, b, c, d, e, f, g, h, i, j)

Since: base-2.1

Instance details

Defined in GHC.Enum

Methods

minBound :: (a, b, c, d, e, f, g, h, i, j) #

maxBound :: (a, b, c, d, e, f, g, h, i, j) #

(Bounded a, Bounded b, Bounded c, Bounded d, Bounded e, Bounded f, Bounded g, Bounded h, Bounded i, Bounded j, Bounded k) => Bounded (a, b, c, d, e, f, g, h, i, j, k)

Since: base-2.1

Instance details

Defined in GHC.Enum

Methods

minBound :: (a, b, c, d, e, f, g, h, i, j, k) #

maxBound :: (a, b, c, d, e, f, g, h, i, j, k) #

(Bounded a, Bounded b, Bounded c, Bounded d, Bounded e, Bounded f, Bounded g, Bounded h, Bounded i, Bounded j, Bounded k, Bounded l) => Bounded (a, b, c, d, e, f, g, h, i, j, k, l)

Since: base-2.1

Instance details

Defined in GHC.Enum

Methods

minBound :: (a, b, c, d, e, f, g, h, i, j, k, l) #

maxBound :: (a, b, c, d, e, f, g, h, i, j, k, l) #

(Bounded a, Bounded b, Bounded c, Bounded d, Bounded e, Bounded f, Bounded g, Bounded h, Bounded i, Bounded j, Bounded k, Bounded l, Bounded m) => Bounded (a, b, c, d, e, f, g, h, i, j, k, l, m)

Since: base-2.1

Instance details

Defined in GHC.Enum

Methods

minBound :: (a, b, c, d, e, f, g, h, i, j, k, l, m) #

maxBound :: (a, b, c, d, e, f, g, h, i, j, k, l, m) #

(Bounded a, Bounded b, Bounded c, Bounded d, Bounded e, Bounded f, Bounded g, Bounded h, Bounded i, Bounded j, Bounded k, Bounded l, Bounded m, Bounded n) => Bounded (a, b, c, d, e, f, g, h, i, j, k, l, m, n)

Since: base-2.1

Instance details

Defined in GHC.Enum

Methods

minBound :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n) #

maxBound :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n) #

(Bounded a, Bounded b, Bounded c, Bounded d, Bounded e, Bounded f, Bounded g, Bounded h, Bounded i, Bounded j, Bounded k, Bounded l, Bounded m, Bounded n, Bounded o) => Bounded (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o)

Since: base-2.1

Instance details

Defined in GHC.Enum

Methods

minBound :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) #

maxBound :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) #

class Enum a where #

Class Enum defines operations on sequentially ordered types.

The enumFrom... methods are used in Haskell's translation of arithmetic sequences.

Instances of Enum may be derived for any enumeration type (types whose constructors have no fields). The nullary constructors are assumed to be numbered left-to-right by fromEnum from 0 through n-1. See Chapter 10 of the Haskell Report for more details.

For any type that is an instance of class Bounded as well as Enum, the following should hold:

   enumFrom     x   = enumFromTo     x maxBound
   enumFromThen x y = enumFromThenTo x y bound
     where
       bound | fromEnum y >= fromEnum x = maxBound
             | otherwise                = minBound

Minimal complete definition

toEnum, fromEnum

Methods

succ :: a -> a #

the successor of a value. For numeric types, succ adds 1.

pred :: a -> a #

the predecessor of a value. For numeric types, pred subtracts 1.

toEnum :: Int -> a #

Convert from an Int.

fromEnum :: a -> Int #

Convert to an Int. It is implementation-dependent what fromEnum returns when applied to a value that is too large to fit in an Int.

enumFrom :: a -> [a] #

Used in Haskell's translation of [n..] with [n..] = enumFrom n, a possible implementation being enumFrom n = n : enumFrom (succ n). For example:

  • enumFrom 4 :: [Integer] = [4,5,6,7,...]
  • enumFrom 6 :: [Int] = [6,7,8,9,...,maxBound :: Int]

enumFromThen :: a -> a -> [a] #

Used in Haskell's translation of [n,n'..] with [n,n'..] = enumFromThen n n', a possible implementation being enumFromThen n n' = n : n' : worker (f x) (f x n'), worker s v = v : worker s (s v), x = fromEnum n' - fromEnum n and f n y | n > 0 = f (n - 1) (succ y) | n < 0 = f (n + 1) (pred y) | otherwise = y For example:

  • enumFromThen 4 6 :: [Integer] = [4,6,8,10...]
  • enumFromThen 6 2 :: [Int] = [6,2,-2,-6,...,minBound :: Int]

enumFromTo :: a -> a -> [a] #

Used in Haskell's translation of [n..m] with [n..m] = enumFromTo n m, a possible implementation being enumFromTo n m | n <= m = n : enumFromTo (succ n) m | otherwise = []. For example:

  • enumFromTo 6 10 :: [Int] = [6,7,8,9,10]
  • enumFromTo 42 1 :: [Integer] = []

enumFromThenTo :: a -> a -> a -> [a] #

Used in Haskell's translation of [n,n'..m] with [n,n'..m] = enumFromThenTo n n' m, a possible implementation being enumFromThenTo n n' m = worker (f x) (c x) n m, x = fromEnum n' - fromEnum n, c x = bool (>=) ((x 0) f n y | n > 0 = f (n - 1) (succ y) | n < 0 = f (n + 1) (pred y) | otherwise = y and worker s c v m | c v m = v : worker s c (s v) m | otherwise = [] For example:

  • enumFromThenTo 4 2 -6 :: [Integer] = [4,2,0,-2,-4,-6]
  • enumFromThenTo 6 8 2 :: [Int] = []

Instances

Instances details
Enum Bool

Since: base-2.1

Instance details

Defined in GHC.Enum

Methods

succ :: Bool -> Bool #

pred :: Bool -> Bool #

toEnum :: Int -> Bool #

fromEnum :: Bool -> Int #

enumFrom :: Bool -> [Bool] #

enumFromThen :: Bool -> Bool -> [Bool] #

enumFromTo :: Bool -> Bool -> [Bool] #

enumFromThenTo :: Bool -> Bool -> Bool -> [Bool] #

Enum Char

Since: base-2.1

Instance details

Defined in GHC.Enum

Methods

succ :: Char -> Char #

pred :: Char -> Char #

toEnum :: Int -> Char #

fromEnum :: Char -> Int #

enumFrom :: Char -> [Char] #

enumFromThen :: Char -> Char -> [Char] #

enumFromTo :: Char -> Char -> [Char] #

enumFromThenTo :: Char -> Char -> Char -> [Char] #

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

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

Enum Int16

Since: base-2.1

Instance details

Defined in GHC.Int

Enum Int32

Since: base-2.1

Instance details

Defined in GHC.Int

Enum Int64

Since: base-2.1

Instance details

Defined in GHC.Int

Enum Integer

Since: base-2.1

Instance details

Defined in GHC.Enum

Enum Natural

Since: base-4.8.0.0

Instance details

Defined in GHC.Enum

Enum Ordering

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

Enum Word8

Since: base-2.1

Instance details

Defined in GHC.Word

Enum Word16

Since: base-2.1

Instance details

Defined in GHC.Word

Enum Word32

Since: base-2.1

Instance details

Defined in GHC.Word

Enum Word64

Since: base-2.1

Instance details

Defined in GHC.Word

Enum VecCount

Since: base-4.10.0.0

Instance details

Defined in GHC.Enum

Enum VecElem

Since: base-4.10.0.0

Instance details

Defined in GHC.Enum

Enum ()

Since: base-2.1

Instance details

Defined in GHC.Enum

Methods

succ :: () -> () #

pred :: () -> () #

toEnum :: Int -> () #

fromEnum :: () -> Int #

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

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

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

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

Enum Associativity

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Enum SourceUnpackedness

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Enum SourceStrictness

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Enum DecidedStrictness

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Enum IOMode

Since: base-4.2.0.0

Instance details

Defined in GHC.IO.IOMode

Enum UTF32_Invalid 
Instance details

Defined in Basement.String.Encoding.UTF32

Methods

succ :: UTF32_Invalid -> UTF32_Invalid #

pred :: UTF32_Invalid -> UTF32_Invalid #

toEnum :: Int -> UTF32_Invalid #

fromEnum :: UTF32_Invalid -> Int #

enumFrom :: UTF32_Invalid -> [UTF32_Invalid] #

enumFromThen :: UTF32_Invalid -> UTF32_Invalid -> [UTF32_Invalid] #

enumFromTo :: UTF32_Invalid -> UTF32_Invalid -> [UTF32_Invalid] #

enumFromThenTo :: UTF32_Invalid -> UTF32_Invalid -> UTF32_Invalid -> [UTF32_Invalid] #

Enum Encoding 
Instance details

Defined in Basement.String

Enum CryptoError 
Instance details

Defined in Crypto.Error.Types

Enum Extension 
Instance details

Defined in GHC.LanguageExtensions.Type

Enum Mutez 
Instance details

Defined in Tezos.Core

Enum KeyHashTag 
Instance details

Defined in Tezos.Crypto

Enum EntriesOrder 
Instance details

Defined in Michelson.Untyped.Contract

Enum Undefined 
Instance details

Defined in Universum.Debug

Class () (Enum a) 
Instance details

Defined in Data.Constraint

Methods

cls :: Enum a :- () #

a :=> (Enum (Dict a)) 
Instance details

Defined in Data.Constraint

Methods

ins :: a :- Enum (Dict a) #

() :=> (Enum Bool) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Enum Bool #

() :=> (Enum Char) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Enum Char #

() :=> (Enum Double) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Enum Double #

() :=> (Enum Float) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Enum Float #

() :=> (Enum Int) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Enum Int #

() :=> (Enum Integer) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Enum Integer #

() :=> (Enum Natural) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Enum Natural #

() :=> (Enum Ordering) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Enum Ordering #

() :=> (Enum Word) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Enum Word #

() :=> (Enum ()) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Enum () #

Integral a => Enum (Ratio a)

Since: base-2.0.1

Instance details

Defined in GHC.Real

Methods

succ :: Ratio a -> Ratio a #

pred :: Ratio a -> Ratio a #

toEnum :: Int -> Ratio a #

fromEnum :: Ratio a -> Int #

enumFrom :: Ratio a -> [Ratio a] #

enumFromThen :: Ratio a -> Ratio a -> [Ratio a] #

enumFromTo :: Ratio a -> Ratio a -> [Ratio a] #

enumFromThenTo :: Ratio a -> Ratio a -> Ratio a -> [Ratio a] #

Enum a => Enum (Min a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

succ :: Min a -> Min a #

pred :: Min a -> Min a #

toEnum :: Int -> Min a #

fromEnum :: Min a -> Int #

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

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

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

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

Enum a => Enum (Max a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

succ :: Max a -> Max a #

pred :: Max a -> Max a #

toEnum :: Int -> Max a #

fromEnum :: Max a -> Int #

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

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

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

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

Enum a => Enum (First a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

succ :: First a -> First a #

pred :: First a -> First a #

toEnum :: Int -> First a #

fromEnum :: First a -> Int #

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

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

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

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

Enum a => Enum (Last a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

succ :: Last a -> Last a #

pred :: Last a -> Last a #

toEnum :: Int -> Last a #

fromEnum :: Last a -> Int #

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

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

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

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

Enum a => Enum (WrappedMonoid a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Enum a => Enum (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

Enum (Offset ty) 
Instance details

Defined in Basement.Types.OffsetSize

Methods

succ :: Offset ty -> Offset ty #

pred :: Offset ty -> Offset ty #

toEnum :: Int -> Offset ty #

fromEnum :: Offset ty -> Int #

enumFrom :: Offset ty -> [Offset ty] #

enumFromThen :: Offset ty -> Offset ty -> [Offset ty] #

enumFromTo :: Offset ty -> Offset ty -> [Offset ty] #

enumFromThenTo :: Offset ty -> Offset ty -> Offset ty -> [Offset ty] #

Enum (CountOf ty) 
Instance details

Defined in Basement.Types.OffsetSize

Methods

succ :: CountOf ty -> CountOf ty #

pred :: CountOf ty -> CountOf ty #

toEnum :: Int -> CountOf ty #

fromEnum :: CountOf ty -> Int #

enumFrom :: CountOf ty -> [CountOf ty] #

enumFromThen :: CountOf ty -> CountOf ty -> [CountOf ty] #

enumFromTo :: CountOf ty -> CountOf ty -> [CountOf ty] #

enumFromThenTo :: CountOf ty -> CountOf ty -> CountOf ty -> [CountOf ty] #

a => Enum (Dict a) 
Instance details

Defined in Data.Constraint

Methods

succ :: Dict a -> Dict a #

pred :: Dict a -> Dict a #

toEnum :: Int -> Dict a #

fromEnum :: Dict a -> Int #

enumFrom :: Dict a -> [Dict a] #

enumFromThen :: Dict a -> Dict a -> [Dict a] #

enumFromTo :: Dict a -> Dict a -> [Dict a] #

enumFromThenTo :: Dict a -> Dict a -> Dict a -> [Dict a] #

(Enum a) :=> (Enum (Identity a)) 
Instance details

Defined in Data.Constraint

Methods

ins :: Enum a :- Enum (Identity a) #

(Enum a) :=> (Enum (Const a b)) 
Instance details

Defined in Data.Constraint

Methods

ins :: Enum a :- Enum (Const a b) #

(Integral a) :=> (Enum (Ratio a)) 
Instance details

Defined in Data.Constraint

Methods

ins :: Integral a :- Enum (Ratio a) #

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

Class (Real a, Enum a) (Integral a) 
Instance details

Defined in Data.Constraint

Methods

cls :: Integral a :- (Real a, Enum a) #

Enum a => Enum (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Methods

succ :: Const a b -> Const a b #

pred :: Const a b -> Const a b #

toEnum :: Int -> Const a b #

fromEnum :: Const a b -> Int #

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

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

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

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

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

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

Coercible a b => Enum (Coercion a b)

Since: base-4.7.0.0

Instance details

Defined in Data.Type.Coercion

Methods

succ :: Coercion a b -> Coercion a b #

pred :: Coercion a b -> Coercion a b #

toEnum :: Int -> Coercion a b #

fromEnum :: Coercion a b -> Int #

enumFrom :: Coercion a b -> [Coercion a b] #

enumFromThen :: Coercion a b -> Coercion a b -> [Coercion a b] #

enumFromTo :: Coercion a b -> Coercion a b -> [Coercion a b] #

enumFromThenTo :: Coercion a b -> Coercion a b -> Coercion a b -> [Coercion 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] #

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

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

class Eq a #

The Eq class defines equality (==) and inequality (/=). All the basic datatypes exported by the Prelude are instances of Eq, and Eq may be derived for any datatype whose constituents are also instances of Eq.

The Haskell Report defines no laws for Eq. However, == is customarily expected to implement an equivalence relationship where two values comparing equal are indistinguishable by "public" functions, with a "public" function being one not allowing to see implementation details. For example, for a type representing non-normalised natural numbers modulo 100, a "public" function doesn't make the difference between 1 and 201. It is expected to have the following properties:

Reflexivity
x == x = True
Symmetry
x == y = y == x
Transitivity
if x == y && y == z = True, then x == z = True
Substitutivity
if x == y = True and f is a "public" function whose return type is an instance of Eq, then f x == f y = True
Negation
x /= y = not (x == y)

Minimal complete definition: either == or /=.

Minimal complete definition

(==) | (/=)

Instances

Instances details
Eq Bool 
Instance details

Defined in GHC.Classes

Methods

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

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

Eq Char 
Instance details

Defined in GHC.Classes

Methods

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

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

Eq Double

Note that due to the presence of NaN, Double's Eq instance does not satisfy reflexivity.

>>> 0/0 == (0/0 :: Double)
False

Also note that Double's Eq instance does not satisfy substitutivity:

>>> 0 == (-0 :: Double)
True
>>> recip 0 == recip (-0 :: Double)
False
Instance details

Defined in GHC.Classes

Methods

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

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

Eq Float

Note that due to the presence of NaN, Float's Eq instance does not satisfy reflexivity.

>>> 0/0 == (0/0 :: Float)
False

Also note that Float's Eq instance does not satisfy substitutivity:

>>> 0 == (-0 :: Float)
True
>>> recip 0 == recip (-0 :: Float)
False
Instance details

Defined in GHC.Classes

Methods

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

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

Eq Int 
Instance details

Defined in GHC.Classes

Methods

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

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

Eq Int8

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

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

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

Eq Int16

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

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

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

Eq Int32

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

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

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

Eq Int64

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

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

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

Eq Integer 
Instance details

Defined in GHC.Integer.Type

Methods

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

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

Eq Natural

Since: base-4.8.0.0

Instance details

Defined in GHC.Natural

Methods

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

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

Eq Ordering 
Instance details

Defined in GHC.Classes

Eq Word 
Instance details

Defined in GHC.Classes

Methods

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

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

Eq Word8

Since: base-2.1

Instance details

Defined in GHC.Word

Methods

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

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

Eq Word16

Since: base-2.1

Instance details

Defined in GHC.Word

Methods

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

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

Eq Word32

Since: base-2.1

Instance details

Defined in GHC.Word

Methods

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

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

Eq Word64

Since: base-2.1

Instance details

Defined in GHC.Word

Methods

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

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

Eq SomeTypeRep 
Instance details

Defined in Data.Typeable.Internal

Eq Exp 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

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

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

Eq Match 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

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

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

Eq Clause 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

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

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

Eq Pat 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

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

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

Eq Type 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

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

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

Eq Dec 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

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

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

Eq Name 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

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

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

Eq FunDep 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

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

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

Eq InjectivityAnn 
Instance details

Defined in Language.Haskell.TH.Syntax

Eq Overlap 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

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

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

Eq () 
Instance details

Defined in GHC.Classes

Methods

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

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

Eq TyCon 
Instance details

Defined in GHC.Classes

Methods

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

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

Eq Module 
Instance details

Defined in GHC.Classes

Methods

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

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

Eq TrName 
Instance details

Defined in GHC.Classes

Methods

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

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

Eq Version

Since: base-2.1

Instance details

Defined in Data.Version

Methods

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

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

Eq Con 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

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

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

Eq ByteString 
Instance details

Defined in Data.ByteString.Internal

Eq ByteString 
Instance details

Defined in Data.ByteString.Lazy.Internal

Eq Scientific

Scientific numbers can be safely compared for equality. No magnitude 10^e is calculated so there's no risk of a blowup in space or time when comparing scientific numbers coming from untrusted sources.

Instance details

Defined in Data.Scientific

Eq UTCTime 
Instance details

Defined in Data.Time.Clock.Internal.UTCTime

Methods

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

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

Eq JSONPathElement 
Instance details

Defined in Data.Aeson.Types.Internal

Eq Value 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

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

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

Eq DotNetTime 
Instance details

Defined in Data.Aeson.Types.Internal

Eq SumEncoding 
Instance details

Defined in Data.Aeson.Types.Internal

Eq Handle

Since: base-4.1.0.0

Instance details

Defined in GHC.IO.Handle.Types

Methods

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

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

Eq Pos 
Instance details

Defined in Data.Attoparsec.Internal.Types

Methods

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

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

Eq More 
Instance details

Defined in Data.Attoparsec.Internal.Types

Methods

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

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

Eq BigNat 
Instance details

Defined in GHC.Integer.Type

Methods

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

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

Eq Void

Since: base-4.8.0.0

Instance details

Defined in Data.Void

Methods

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

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

Eq SpecConstrAnnotation

Since: base-4.3.0.0

Instance details

Defined in GHC.Exts

Eq Constr

Equality of constructors

Since: base-4.0.0.0

Instance details

Defined in Data.Data

Methods

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

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

Eq DataRep

Since: base-4.0.0.0

Instance details

Defined in Data.Data

Methods

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

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

Eq ConstrRep

Since: base-4.0.0.0

Instance details

Defined in Data.Data

Eq Fixity

Since: base-4.0.0.0

Instance details

Defined in Data.Data

Methods

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

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

Eq ThreadId

Since: base-4.2.0.0

Instance details

Defined in GHC.Conc.Sync

Eq BlockReason

Since: base-4.3.0.0

Instance details

Defined in GHC.Conc.Sync

Eq ThreadStatus

Since: base-4.3.0.0

Instance details

Defined in GHC.Conc.Sync

Eq AsyncException

Since: base-4.2.0.0

Instance details

Defined in GHC.IO.Exception

Eq ArrayException

Since: base-4.2.0.0

Instance details

Defined in GHC.IO.Exception

Eq ExitCode 
Instance details

Defined in GHC.IO.Exception

Eq IOErrorType

Since: base-4.1.0.0

Instance details

Defined in GHC.IO.Exception

Eq BufferMode

Since: base-4.2.0.0

Instance details

Defined in GHC.IO.Handle.Types

Eq Newline

Since: base-4.2.0.0

Instance details

Defined in GHC.IO.Handle.Types

Methods

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

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

Eq NewlineMode

Since: base-4.2.0.0

Instance details

Defined in GHC.IO.Handle.Types

Eq MaskingState

Since: base-4.3.0.0

Instance details

Defined in GHC.IO

Eq IOException

Since: base-4.1.0.0

Instance details

Defined in GHC.IO.Exception

Eq ErrorCall

Since: base-4.7.0.0

Instance details

Defined in GHC.Exception

Eq ArithException

Since: base-3.0

Instance details

Defined in GHC.Exception.Type

Eq All

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Methods

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

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

Eq Any

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Methods

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

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

Eq Fixity

Since: base-4.6.0.0

Instance details

Defined in GHC.Generics

Methods

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

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

Eq Associativity

Since: base-4.6.0.0

Instance details

Defined in GHC.Generics

Eq SourceUnpackedness

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Eq SourceStrictness

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Eq DecidedStrictness

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Eq SomeSymbol

Since: base-4.7.0.0

Instance details

Defined in GHC.TypeLits

Eq SomeNat

Since: base-4.7.0.0

Instance details

Defined in GHC.TypeNats

Methods

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

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

Eq IOMode

Since: base-4.2.0.0

Instance details

Defined in GHC.IO.IOMode

Methods

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

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

Eq SrcLoc

Since: base-4.9.0.0

Instance details

Defined in GHC.Stack.Types

Methods

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

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

Eq Alphabet 
Instance details

Defined in Data.ByteString.Base58.Internal

Eq ASCII7_Invalid 
Instance details

Defined in Basement.String.Encoding.ASCII7

Methods

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

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

Eq ISO_8859_1_Invalid 
Instance details

Defined in Basement.String.Encoding.ISO_8859_1

Methods

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

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

Eq UTF16_Invalid 
Instance details

Defined in Basement.String.Encoding.UTF16

Methods

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

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

Eq UTF32_Invalid 
Instance details

Defined in Basement.String.Encoding.UTF32

Methods

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

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

Eq Encoding 
Instance details

Defined in Basement.String

Eq String 
Instance details

Defined in Basement.UTF8.Base

Methods

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

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

Eq FileSize 
Instance details

Defined in Basement.Types.OffsetSize

Eq BimapException 
Instance details

Defined in Data.Bimap

Methods

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

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

Eq IntSet 
Instance details

Defined in Data.IntSet.Internal

Methods

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

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

Eq Signature 
Instance details

Defined in Crypto.PubKey.ECC.ECDSA

Eq PrivateKey 
Instance details

Defined in Crypto.PubKey.ECC.ECDSA

Eq PublicKey 
Instance details

Defined in Crypto.PubKey.ECC.ECDSA

Eq KeyPair 
Instance details

Defined in Crypto.PubKey.ECC.ECDSA

Methods

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

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

Eq SecretKey 
Instance details

Defined in Crypto.PubKey.Ed25519

Eq PublicKey 
Instance details

Defined in Crypto.PubKey.Ed25519

Eq Signature 
Instance details

Defined in Crypto.PubKey.Ed25519

Eq CryptoError 
Instance details

Defined in Crypto.Error.Types

Eq Extension 
Instance details

Defined in GHC.LanguageExtensions.Type

Eq ForeignSrcLang 
Instance details

Defined in GHC.ForeignSrcLang.Type

Eq Boxed 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

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

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

Eq Tool 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

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

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

Eq SrcLoc 
Instance details

Defined in Language.Haskell.Exts.SrcLoc

Methods

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

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

Eq SrcSpan 
Instance details

Defined in Language.Haskell.Exts.SrcLoc

Methods

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

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

Eq SrcSpanInfo 
Instance details

Defined in Language.Haskell.Exts.SrcLoc

Eq Mode 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Methods

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

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

Eq Style 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Methods

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

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

Eq AnnLookup 
Instance details

Defined in Language.Haskell.TH.Syntax

Eq Role 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

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

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

Eq TyLit 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

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

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

Eq FamilyResultSig 
Instance details

Defined in Language.Haskell.TH.Syntax

Eq TyVarBndr 
Instance details

Defined in Language.Haskell.TH.Syntax

Eq PatSynArgs 
Instance details

Defined in Language.Haskell.TH.Syntax

Eq PatSynDir 
Instance details

Defined in Language.Haskell.TH.Syntax

Eq Bang 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

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

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

Eq DecidedStrictness 
Instance details

Defined in Language.Haskell.TH.Syntax

Eq SourceStrictness 
Instance details

Defined in Language.Haskell.TH.Syntax

Eq SourceUnpackedness 
Instance details

Defined in Language.Haskell.TH.Syntax

Eq AnnTarget 
Instance details

Defined in Language.Haskell.TH.Syntax

Eq RuleBndr 
Instance details

Defined in Language.Haskell.TH.Syntax

Eq Phases 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

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

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

Eq RuleMatch 
Instance details

Defined in Language.Haskell.TH.Syntax

Eq Inline 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

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

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

Eq Pragma 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

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

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

Eq Safety 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

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

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

Eq Callconv 
Instance details

Defined in Language.Haskell.TH.Syntax

Eq Foreign 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

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

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

Eq TySynEqn 
Instance details

Defined in Language.Haskell.TH.Syntax

Eq TypeFamilyHead 
Instance details

Defined in Language.Haskell.TH.Syntax

Eq DerivStrategy 
Instance details

Defined in Language.Haskell.TH.Syntax

Eq DerivClause 
Instance details

Defined in Language.Haskell.TH.Syntax

Eq Range 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

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

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

Eq Stmt 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

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

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

Eq Guard 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

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

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

Eq Body 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

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

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

Eq Lit 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

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

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

Eq FixityDirection 
Instance details

Defined in Language.Haskell.TH.Syntax

Eq Fixity 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

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

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

Eq ModuleInfo 
Instance details

Defined in Language.Haskell.TH.Syntax

Eq Info 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

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

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

Eq Loc 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

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

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

Eq NameSpace 
Instance details

Defined in Language.Haskell.TH.Syntax

Eq T 
Instance details

Defined in Michelson.Typed.T

Methods

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

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

Eq ParseLorentzError 
Instance details

Defined in Lorentz.Base

Methods

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

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

Eq EntryPointLookupError 
Instance details

Defined in Lorentz.UParam

Eq ParamBuilder 
Instance details

Defined in Lorentz.EntryPoints.Doc

Eq ParamBuildingDesc 
Instance details

Defined in Lorentz.EntryPoints.Doc

Eq ParamBuildingStep 
Instance details

Defined in Lorentz.EntryPoints.Doc

Eq DDescribeErrorTagMap 
Instance details

Defined in Lorentz.Errors.Numeric.Doc

Eq DUStoreTemplate 
Instance details

Defined in Lorentz.UStore.Doc

Eq SomeError 
Instance details

Defined in Lorentz.Errors

Eq DError 
Instance details

Defined in Lorentz.Errors

Methods

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

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

Eq DThrows 
Instance details

Defined in Lorentz.Errors

Methods

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

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

Eq EpCallingStep 
Instance details

Defined in Lorentz.EntryPoints.Core

Eq EpName 
Instance details

Defined in Michelson.Untyped.EntryPoints

Methods

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

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

Eq MText 
Instance details

Defined in Michelson.Text

Methods

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

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

Eq KeyHash 
Instance details

Defined in Tezos.Crypto

Methods

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

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

Eq Signature 
Instance details

Defined in Tezos.Crypto

Eq PublicKey 
Instance details

Defined in Tezos.Crypto

Eq ChainId 
Instance details

Defined in Tezos.Core

Methods

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

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

Eq Timestamp 
Instance details

Defined in Tezos.Core

Eq Mutez 
Instance details

Defined in Tezos.Core

Methods

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

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

Eq Address 
Instance details

Defined in Tezos.Address

Methods

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

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

Eq EpAddress 
Instance details

Defined in Michelson.Typed.EntryPoints

Eq SomeDocDefinitionItem 
Instance details

Defined in Michelson.Doc

Eq DocItemId 
Instance details

Defined in Michelson.Doc

Eq DType 
Instance details

Defined in Michelson.Typed.Haskell.Doc

Methods

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

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

Eq Pos 
Instance details

Defined in Text.Megaparsec.Pos

Methods

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

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

Eq InvalidPosException 
Instance details

Defined in Text.Megaparsec.Pos

Eq SourcePos 
Instance details

Defined in Text.Megaparsec.Pos

Eq DocItemPos 
Instance details

Defined in Michelson.Doc

Methods

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

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

Eq AnalyzerRes 
Instance details

Defined in Michelson.Analyzer

Eq MichelsonFailed 
Instance details

Defined in Michelson.Interpret

Eq MorleyLogs 
Instance details

Defined in Michelson.Interpret

Eq RemainingSteps 
Instance details

Defined in Michelson.Interpret

Eq LetMacro 
Instance details

Defined in Michelson.Macro

Eq PairStruct 
Instance details

Defined in Michelson.Macro

Eq UnpairStruct 
Instance details

Defined in Michelson.Macro

Eq CadrStruct 
Instance details

Defined in Michelson.Macro

Eq ParsedOp 
Instance details

Defined in Michelson.Macro

Eq Macro 
Instance details

Defined in Michelson.Macro

Methods

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

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

Eq ExpectType 
Instance details

Defined in Michelson.TypeCheck.Error

Eq TypeContext 
Instance details

Defined in Michelson.TypeCheck.Error

Eq TCTypeError 
Instance details

Defined in Michelson.TypeCheck.Error

Eq TCError 
Instance details

Defined in Michelson.TypeCheck.Error

Methods

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

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

Eq StackSize 
Instance details

Defined in Michelson.TypeCheck.Error

Eq ExtError 
Instance details

Defined in Michelson.TypeCheck.Error

Eq SomeHST 
Instance details

Defined in Michelson.TypeCheck.Types

Methods

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

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

Eq ArithErrorType 
Instance details

Defined in Michelson.Typed.Arith

Eq SetDelegate 
Instance details

Defined in Michelson.Typed.Value

Eq ParseEpAddressError 
Instance details

Defined in Michelson.Typed.EntryPoints

Eq ArmCoord 
Instance details

Defined in Michelson.Typed.EntryPoints

Eq ParamEpError 
Instance details

Defined in Michelson.Typed.EntryPoints

Eq AnnConvergeError 
Instance details

Defined in Michelson.Typed.Annotation

Eq ExpandedOp 
Instance details

Defined in Michelson.Untyped.Instr

Eq OriginationOperation 
Instance details

Defined in Michelson.Untyped.Instr

Eq GlobalCounter 
Instance details

Defined in Michelson.Untyped.Instr

Eq InternalByteString 
Instance details

Defined in Michelson.Untyped.Value

Eq ContractHash 
Instance details

Defined in Tezos.Address

Eq OperationHash 
Instance details

Defined in Tezos.Address

Eq OriginationIndex 
Instance details

Defined in Tezos.Address

Eq ParseAddressError 
Instance details

Defined in Tezos.Address

Eq ParseAddressRawError 
Instance details

Defined in Tezos.Address

Eq ParseContractAddressError 
Instance details

Defined in Tezos.Address

Eq SecretKey 
Instance details

Defined in Tezos.Crypto

Eq KeyHashTag 
Instance details

Defined in Tezos.Crypto

Eq PublicKey 
Instance details

Defined in Tezos.Crypto.Ed25519

Eq SecretKey 
Instance details

Defined in Tezos.Crypto.Ed25519

Eq Signature 
Instance details

Defined in Tezos.Crypto.Ed25519

Eq PublicKey 
Instance details

Defined in Tezos.Crypto.P256

Eq SecretKey 
Instance details

Defined in Tezos.Crypto.P256

Eq Signature 
Instance details

Defined in Tezos.Crypto.P256

Eq PublicKey 
Instance details

Defined in Tezos.Crypto.Secp256k1

Eq SecretKey 
Instance details

Defined in Tezos.Crypto.Secp256k1

Eq Signature 
Instance details

Defined in Tezos.Crypto.Secp256k1

Eq CustomParserException 
Instance details

Defined in Michelson.Parser.Error

Eq StringLiteralParserException 
Instance details

Defined in Michelson.Parser.Error

Eq ParserException 
Instance details

Defined in Michelson.Parser.Error

Eq EpNameFromRefAnnError 
Instance details

Defined in Michelson.Untyped.EntryPoints

Eq Positive 
Instance details

Defined in Util.Positive

Eq UnpackError 
Instance details

Defined in Util.Binary

Eq Pos 
Instance details

Defined in Michelson.ErrorPos

Methods

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

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

Eq SrcPos 
Instance details

Defined in Michelson.ErrorPos

Methods

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

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

Eq LetName 
Instance details

Defined in Michelson.ErrorPos

Methods

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

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

Eq InstrCallStack 
Instance details

Defined in Michelson.ErrorPos

Eq BadTypeForScope 
Instance details

Defined in Michelson.Typed.Scope

Eq EntriesOrder 
Instance details

Defined in Michelson.Untyped.Contract

Eq StackRef 
Instance details

Defined in Michelson.Untyped.Ext

Eq Var 
Instance details

Defined in Michelson.Untyped.Ext

Methods

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

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

Eq TyVar 
Instance details

Defined in Michelson.Untyped.Ext

Methods

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

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

Eq StackTypePattern 
Instance details

Defined in Michelson.Untyped.Ext

Eq StackFn 
Instance details

Defined in Michelson.Untyped.Ext

Methods

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

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

Eq PrintComment 
Instance details

Defined in Michelson.Untyped.Ext

Eq Type 
Instance details

Defined in Michelson.Untyped.Type

Methods

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

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

Eq ParameterType 
Instance details

Defined in Michelson.Untyped.Type

Eq T 
Instance details

Defined in Michelson.Untyped.Type

Methods

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

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

Eq AnnotationSet 
Instance details

Defined in Michelson.Untyped.Annotation

Eq CryptoParseError 
Instance details

Defined in Tezos.Crypto.Util

Eq Undefined 
Instance details

Defined in Universum.Debug

Eq UnicodeException 
Instance details

Defined in Data.Text.Encoding.Error

Eq Doc 
Instance details

Defined in Text.PrettyPrint.HughesPJ

Methods

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

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

Eq TextDetails 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Eq ByteArray

Since: primitive-0.6.3.0

Instance details

Defined in Data.Primitive.ByteArray

Eq ModName 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

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

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

Eq PkgName 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

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

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

Eq Module 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

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

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

Eq OccName 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

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

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

Eq NameFlavour 
Instance details

Defined in Language.Haskell.TH.Syntax

Eq DatatypeInfo 
Instance details

Defined in Language.Haskell.TH.Datatype

Eq DatatypeVariant 
Instance details

Defined in Language.Haskell.TH.Datatype

Eq ConstructorInfo 
Instance details

Defined in Language.Haskell.TH.Datatype

Eq ConstructorVariant 
Instance details

Defined in Language.Haskell.TH.Datatype

Eq FieldStrictness 
Instance details

Defined in Language.Haskell.TH.Datatype

Eq Unpackedness 
Instance details

Defined in Language.Haskell.TH.Datatype

Eq Strictness 
Instance details

Defined in Language.Haskell.TH.Datatype

Eq DTypeArg 
Instance details

Defined in Language.Haskell.TH.Desugar.Core

Eq DExp 
Instance details

Defined in Language.Haskell.TH.Desugar.AST

Methods

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

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

Eq DPat 
Instance details

Defined in Language.Haskell.TH.Desugar.AST

Methods

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

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

Eq DType 
Instance details

Defined in Language.Haskell.TH.Desugar.AST

Methods

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

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

Eq DTyVarBndr 
Instance details

Defined in Language.Haskell.TH.Desugar.AST

Eq DMatch 
Instance details

Defined in Language.Haskell.TH.Desugar.AST

Methods

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

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

Eq DClause 
Instance details

Defined in Language.Haskell.TH.Desugar.AST

Methods

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

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

Eq DLetDec 
Instance details

Defined in Language.Haskell.TH.Desugar.AST

Methods

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

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

Eq NewOrData 
Instance details

Defined in Language.Haskell.TH.Desugar.AST

Eq DDec 
Instance details

Defined in Language.Haskell.TH.Desugar.AST

Methods

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

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

Eq DPatSynDir 
Instance details

Defined in Language.Haskell.TH.Desugar.AST

Eq DTypeFamilyHead 
Instance details

Defined in Language.Haskell.TH.Desugar.AST

Eq DFamilyResultSig 
Instance details

Defined in Language.Haskell.TH.Desugar.AST

Eq DCon 
Instance details

Defined in Language.Haskell.TH.Desugar.AST

Methods

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

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

Eq DConFields 
Instance details

Defined in Language.Haskell.TH.Desugar.AST

Eq DForeign 
Instance details

Defined in Language.Haskell.TH.Desugar.AST

Eq DPragma 
Instance details

Defined in Language.Haskell.TH.Desugar.AST

Methods

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

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

Eq DRuleBndr 
Instance details

Defined in Language.Haskell.TH.Desugar.AST

Eq DTySynEqn 
Instance details

Defined in Language.Haskell.TH.Desugar.AST

Eq DInfo 
Instance details

Defined in Language.Haskell.TH.Desugar.AST

Methods

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

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

Eq DDerivClause 
Instance details

Defined in Language.Haskell.TH.Desugar.AST

Eq DDerivStrategy 
Instance details

Defined in Language.Haskell.TH.Desugar.AST

Eq LocalTime 
Instance details

Defined in Data.Time.LocalTime.Internal.LocalTime

Eq UnpackedUUID 
Instance details

Defined in Data.UUID.Types.Internal

Methods

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

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

Eq UUID 
Instance details

Defined in Data.UUID.Types.Internal

Methods

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

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

Eq CodePoint 
Instance details

Defined in Data.Text.Encoding

Methods

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

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

Eq DecoderState 
Instance details

Defined in Data.Text.Encoding

Methods

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

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

Eq ParseChainIdError 
Instance details

Defined in Tezos.Core

Methods

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

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

Eq RefId Source # 
Instance details

Defined in Indigo.Internal.State

Methods

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

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

Eq Lambda1Def Source # 
Instance details

Defined in Indigo.Compilation.Lambda

Class () (Eq a) 
Instance details

Defined in Data.Constraint

Methods

cls :: Eq a :- () #

() :=> (Eq Bool) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Eq Bool #

() :=> (Eq Double) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Eq Double #

() :=> (Eq Float) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Eq Float #

() :=> (Eq Int) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Eq Int #

() :=> (Eq Integer) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Eq Integer #

() :=> (Eq Natural) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Eq Natural #

() :=> (Eq Word) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Eq Word #

() :=> (Eq ()) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Eq () #

() :=> (Eq (Dict a)) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Eq (Dict a) #

() :=> (Eq (a :- b)) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Eq (a :- b) #

Eq a => Eq [a] 
Instance details

Defined in GHC.Classes

Methods

(==) :: [a] -> [a] -> Bool #

(/=) :: [a] -> [a] -> Bool #

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 #

Eq a => Eq (Ratio a)

Since: base-2.1

Instance details

Defined in GHC.Real

Methods

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

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

Eq (Ptr a)

Since: base-2.1

Instance details

Defined in GHC.Ptr

Methods

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

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

Eq (FunPtr a) 
Instance details

Defined in GHC.Ptr

Methods

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

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

Eq p => Eq (Par1 p)

Since: base-4.7.0.0

Instance details

Defined in GHC.Generics

Methods

(==) :: Par1 p -> Par1 p -> Bool #

(/=) :: Par1 p -> Par1 p -> Bool #

Eq a => Eq (IResult a) 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

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

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

Eq a => Eq (Result a) 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

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

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

Eq a => Eq (Complex a)

Since: base-2.1

Instance details

Defined in Data.Complex

Methods

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

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

Eq a => Eq (Min a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

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

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

Eq a => Eq (Max a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

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

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

Eq a => Eq (First a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

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

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

Eq a => Eq (Last a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

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

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

Eq m => Eq (WrappedMonoid m)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Eq a => Eq (Option a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

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

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

Eq a => Eq (ZipList a)

Since: base-4.7.0.0

Instance details

Defined in Control.Applicative

Methods

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

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

Eq a => Eq (Identity a)

Since: base-4.8.0.0

Instance details

Defined in Data.Functor.Identity

Methods

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

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

Eq (TVar a)

Since: base-4.8.0.0

Instance details

Defined in GHC.Conc.Sync

Methods

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

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

Eq (IORef a)

Pointer equality.

Since: base-4.0.0.0

Instance details

Defined in GHC.IORef

Methods

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

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

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 #

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 #

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 #

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 #

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 #

Eq a => Eq (Down a)

Since: base-4.6.0.0

Instance details

Defined in Data.Ord

Methods

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

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

Eq (MVar a)

Since: base-4.1.0.0

Instance details

Defined in GHC.MVar

Methods

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

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

Eq a => Eq (NonEmpty a)

Since: base-4.9.0.0

Instance details

Defined in GHC.Base

Methods

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

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

(PrimType ty, Eq ty) => Eq (UArray ty) 
Instance details

Defined in Basement.UArray.Base

Methods

(==) :: UArray ty -> UArray ty -> Bool #

(/=) :: UArray ty -> UArray ty -> Bool #

(PrimType ty, Eq ty) => Eq (Block ty) 
Instance details

Defined in Basement.Block.Base

Methods

(==) :: Block ty -> Block ty -> Bool #

(/=) :: Block ty -> Block ty -> Bool #

Eq a => Eq (NonEmpty a) 
Instance details

Defined in Basement.NonEmpty

Methods

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

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

Eq (Offset ty) 
Instance details

Defined in Basement.Types.OffsetSize

Methods

(==) :: Offset ty -> Offset ty -> Bool #

(/=) :: Offset ty -> Offset ty -> Bool #

Eq (CountOf ty) 
Instance details

Defined in Basement.Types.OffsetSize

Methods

(==) :: CountOf ty -> CountOf ty -> Bool #

(/=) :: CountOf ty -> CountOf ty -> Bool #

Eq (Zn64 n) 
Instance details

Defined in Basement.Bounded

Methods

(==) :: Zn64 n -> Zn64 n -> Bool #

(/=) :: Zn64 n -> Zn64 n -> Bool #

Eq (Zn n) 
Instance details

Defined in Basement.Bounded

Methods

(==) :: Zn n -> Zn n -> Bool #

(/=) :: Zn n -> Zn n -> Bool #

Eq (Dict a) 
Instance details

Defined in Data.Constraint

Methods

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

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

Eq a => Eq (IntMap a) 
Instance details

Defined in Data.IntMap.Internal

Methods

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

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

Eq a => Eq (Tree a) 
Instance details

Defined in Data.Tree

Methods

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

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

Eq a => Eq (Seq a) 
Instance details

Defined in Data.Sequence.Internal

Methods

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

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

Eq a => Eq (ViewL a) 
Instance details

Defined in Data.Sequence.Internal

Methods

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

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

Eq a => Eq (ViewR a) 
Instance details

Defined in Data.Sequence.Internal

Methods

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

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

Eq a => Eq (Set a) 
Instance details

Defined in Data.Set.Internal

Methods

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

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

Eq a => Eq (CryptoFailable a) 
Instance details

Defined in Crypto.Error.Types

Eq a => Eq (DList a) 
Instance details

Defined in Data.DList

Methods

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

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

Eq a => Eq (Hashed a)

Uses precomputed hash to detect inequality faster

Instance details

Defined in Data.Hashable.Class

Methods

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

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

Eq l => Eq (PragmasAndModuleName l) 
Instance details

Defined in Language.Haskell.Exts.Parser

Eq l => Eq (PragmasAndModuleHead l) 
Instance details

Defined in Language.Haskell.Exts.Parser

Eq l => Eq (ModuleHeadAndImports l) 
Instance details

Defined in Language.Haskell.Exts.Parser

Eq a => Eq (NonGreedy a) 
Instance details

Defined in Language.Haskell.Exts.Parser

Methods

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

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

Eq a => Eq (ListOf a) 
Instance details

Defined in Language.Haskell.Exts.Parser

Methods

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

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

Eq l => Eq (ModuleName l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: ModuleName l -> ModuleName l -> Bool #

(/=) :: ModuleName l -> ModuleName l -> Bool #

Eq l => Eq (SpecialCon l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: SpecialCon l -> SpecialCon l -> Bool #

(/=) :: SpecialCon l -> SpecialCon l -> Bool #

Eq l => Eq (QName l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: QName l -> QName l -> Bool #

(/=) :: QName l -> QName l -> Bool #

Eq l => Eq (Name l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: Name l -> Name l -> Bool #

(/=) :: Name l -> Name l -> Bool #

Eq l => Eq (IPName l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: IPName l -> IPName l -> Bool #

(/=) :: IPName l -> IPName l -> Bool #

Eq l => Eq (QOp l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: QOp l -> QOp l -> Bool #

(/=) :: QOp l -> QOp l -> Bool #

Eq l => Eq (Op l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: Op l -> Op l -> Bool #

(/=) :: Op l -> Op l -> Bool #

Eq l => Eq (CName l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: CName l -> CName l -> Bool #

(/=) :: CName l -> CName l -> Bool #

Eq l => Eq (Module l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: Module l -> Module l -> Bool #

(/=) :: Module l -> Module l -> Bool #

Eq l => Eq (ModuleHead l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: ModuleHead l -> ModuleHead l -> Bool #

(/=) :: ModuleHead l -> ModuleHead l -> Bool #

Eq l => Eq (ExportSpecList l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Eq l => Eq (ExportSpec l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: ExportSpec l -> ExportSpec l -> Bool #

(/=) :: ExportSpec l -> ExportSpec l -> Bool #

Eq l => Eq (EWildcard l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: EWildcard l -> EWildcard l -> Bool #

(/=) :: EWildcard l -> EWildcard l -> Bool #

Eq l => Eq (Namespace l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: Namespace l -> Namespace l -> Bool #

(/=) :: Namespace l -> Namespace l -> Bool #

Eq l => Eq (ImportDecl l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: ImportDecl l -> ImportDecl l -> Bool #

(/=) :: ImportDecl l -> ImportDecl l -> Bool #

Eq l => Eq (ImportSpecList l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Eq l => Eq (ImportSpec l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: ImportSpec l -> ImportSpec l -> Bool #

(/=) :: ImportSpec l -> ImportSpec l -> Bool #

Eq l => Eq (Assoc l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: Assoc l -> Assoc l -> Bool #

(/=) :: Assoc l -> Assoc l -> Bool #

Eq l => Eq (Decl l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: Decl l -> Decl l -> Bool #

(/=) :: Decl l -> Decl l -> Bool #

Eq l => Eq (PatternSynDirection l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Eq l => Eq (TypeEqn l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: TypeEqn l -> TypeEqn l -> Bool #

(/=) :: TypeEqn l -> TypeEqn l -> Bool #

Eq l => Eq (Annotation l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: Annotation l -> Annotation l -> Bool #

(/=) :: Annotation l -> Annotation l -> Bool #

Eq l => Eq (BooleanFormula l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Eq l => Eq (Role l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: Role l -> Role l -> Bool #

(/=) :: Role l -> Role l -> Bool #

Eq l => Eq (DataOrNew l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: DataOrNew l -> DataOrNew l -> Bool #

(/=) :: DataOrNew l -> DataOrNew l -> Bool #

Eq l => Eq (InjectivityInfo l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Eq l => Eq (ResultSig l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: ResultSig l -> ResultSig l -> Bool #

(/=) :: ResultSig l -> ResultSig l -> Bool #

Eq l => Eq (DeclHead l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: DeclHead l -> DeclHead l -> Bool #

(/=) :: DeclHead l -> DeclHead l -> Bool #

Eq l => Eq (InstRule l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: InstRule l -> InstRule l -> Bool #

(/=) :: InstRule l -> InstRule l -> Bool #

Eq l => Eq (InstHead l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: InstHead l -> InstHead l -> Bool #

(/=) :: InstHead l -> InstHead l -> Bool #

Eq l => Eq (Deriving l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: Deriving l -> Deriving l -> Bool #

(/=) :: Deriving l -> Deriving l -> Bool #

Eq l => Eq (DerivStrategy l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Eq l => Eq (Binds l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: Binds l -> Binds l -> Bool #

(/=) :: Binds l -> Binds l -> Bool #

Eq l => Eq (IPBind l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: IPBind l -> IPBind l -> Bool #

(/=) :: IPBind l -> IPBind l -> Bool #

Eq l => Eq (Match l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: Match l -> Match l -> Bool #

(/=) :: Match l -> Match l -> Bool #

Eq l => Eq (QualConDecl l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Eq l => Eq (ConDecl l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: ConDecl l -> ConDecl l -> Bool #

(/=) :: ConDecl l -> ConDecl l -> Bool #

Eq l => Eq (FieldDecl l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: FieldDecl l -> FieldDecl l -> Bool #

(/=) :: FieldDecl l -> FieldDecl l -> Bool #

Eq l => Eq (GadtDecl l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: GadtDecl l -> GadtDecl l -> Bool #

(/=) :: GadtDecl l -> GadtDecl l -> Bool #

Eq l => Eq (ClassDecl l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: ClassDecl l -> ClassDecl l -> Bool #

(/=) :: ClassDecl l -> ClassDecl l -> Bool #

Eq l => Eq (InstDecl l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: InstDecl l -> InstDecl l -> Bool #

(/=) :: InstDecl l -> InstDecl l -> Bool #

Eq l => Eq (BangType l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: BangType l -> BangType l -> Bool #

(/=) :: BangType l -> BangType l -> Bool #

Eq l => Eq (Unpackedness l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Eq l => Eq (Rhs l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: Rhs l -> Rhs l -> Bool #

(/=) :: Rhs l -> Rhs l -> Bool #

Eq l => Eq (GuardedRhs l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: GuardedRhs l -> GuardedRhs l -> Bool #

(/=) :: GuardedRhs l -> GuardedRhs l -> Bool #

Eq l => Eq (Type l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: Type l -> Type l -> Bool #

(/=) :: Type l -> Type l -> Bool #

Eq l => Eq (MaybePromotedName l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Eq l => Eq (Promoted l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: Promoted l -> Promoted l -> Bool #

(/=) :: Promoted l -> Promoted l -> Bool #

Eq l => Eq (TyVarBind l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: TyVarBind l -> TyVarBind l -> Bool #

(/=) :: TyVarBind l -> TyVarBind l -> Bool #

Eq l => Eq (FunDep l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: FunDep l -> FunDep l -> Bool #

(/=) :: FunDep l -> FunDep l -> Bool #

Eq l => Eq (Context l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: Context l -> Context l -> Bool #

(/=) :: Context l -> Context l -> Bool #

Eq l => Eq (Asst l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: Asst l -> Asst l -> Bool #

(/=) :: Asst l -> Asst l -> Bool #

Eq l => Eq (Literal l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: Literal l -> Literal l -> Bool #

(/=) :: Literal l -> Literal l -> Bool #

Eq l => Eq (Sign l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: Sign l -> Sign l -> Bool #

(/=) :: Sign l -> Sign l -> Bool #

Eq l => Eq (Exp l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: Exp l -> Exp l -> Bool #

(/=) :: Exp l -> Exp l -> Bool #

Eq l => Eq (XName l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: XName l -> XName l -> Bool #

(/=) :: XName l -> XName l -> Bool #

Eq l => Eq (XAttr l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: XAttr l -> XAttr l -> Bool #

(/=) :: XAttr l -> XAttr l -> Bool #

Eq l => Eq (Bracket l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: Bracket l -> Bracket l -> Bool #

(/=) :: Bracket l -> Bracket l -> Bool #

Eq l => Eq (Splice l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: Splice l -> Splice l -> Bool #

(/=) :: Splice l -> Splice l -> Bool #

Eq l => Eq (Safety l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: Safety l -> Safety l -> Bool #

(/=) :: Safety l -> Safety l -> Bool #

Eq l => Eq (CallConv l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: CallConv l -> CallConv l -> Bool #

(/=) :: CallConv l -> CallConv l -> Bool #

Eq l => Eq (ModulePragma l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Eq l => Eq (Overlap l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: Overlap l -> Overlap l -> Bool #

(/=) :: Overlap l -> Overlap l -> Bool #

Eq l => Eq (Activation l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: Activation l -> Activation l -> Bool #

(/=) :: Activation l -> Activation l -> Bool #

Eq l => Eq (Rule l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: Rule l -> Rule l -> Bool #

(/=) :: Rule l -> Rule l -> Bool #

Eq l => Eq (RuleVar l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: RuleVar l -> RuleVar l -> Bool #

(/=) :: RuleVar l -> RuleVar l -> Bool #

Eq l => Eq (WarningText l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Eq l => Eq (Pat l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: Pat l -> Pat l -> Bool #

(/=) :: Pat l -> Pat l -> Bool #

Eq l => Eq (PXAttr l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: PXAttr l -> PXAttr l -> Bool #

(/=) :: PXAttr l -> PXAttr l -> Bool #

Eq l => Eq (RPatOp l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: RPatOp l -> RPatOp l -> Bool #

(/=) :: RPatOp l -> RPatOp l -> Bool #

Eq l => Eq (RPat l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: RPat l -> RPat l -> Bool #

(/=) :: RPat l -> RPat l -> Bool #

Eq l => Eq (PatField l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: PatField l -> PatField l -> Bool #

(/=) :: PatField l -> PatField l -> Bool #

Eq l => Eq (Stmt l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: Stmt l -> Stmt l -> Bool #

(/=) :: Stmt l -> Stmt l -> Bool #

Eq l => Eq (QualStmt l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: QualStmt l -> QualStmt l -> Bool #

(/=) :: QualStmt l -> QualStmt l -> Bool #

Eq l => Eq (FieldUpdate l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Eq l => Eq (Alt l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: Alt l -> Alt l -> Bool #

(/=) :: Alt l -> Alt l -> Bool #

Eq a => Eq (Loc a) 
Instance details

Defined in Language.Haskell.Exts.SrcLoc

Methods

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

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

(Prim a, Eq a) => Eq (Vector a) 
Instance details

Defined in Data.Vector.Primitive

Methods

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

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

(Storable a, Eq a) => Eq (Vector a) 
Instance details

Defined in Data.Vector.Storable

Methods

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

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

Eq a => Eq (HashSet a) 
Instance details

Defined in Data.HashSet.Base

Methods

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

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

Eq a => Eq (Vector a) 
Instance details

Defined in Data.Vector

Methods

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

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

Eq (Notes t) 
Instance details

Defined in Michelson.Typed.Annotation

Methods

(==) :: Notes t -> Notes t -> Bool #

(/=) :: Notes t -> Notes t -> Bool #

Eq (UParam entries) 
Instance details

Defined in Lorentz.UParam

Methods

(==) :: UParam entries -> UParam entries -> Bool #

(/=) :: UParam entries -> UParam entries -> Bool #

Eq r => Eq (VoidResult r) 
Instance details

Defined in Lorentz.Macro

Methods

(==) :: VoidResult r -> VoidResult r -> Bool #

(/=) :: VoidResult r -> VoidResult r -> Bool #

Eq (UStore a) 
Instance details

Defined in Lorentz.UStore.Types

Methods

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

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

Eq (ErrorArg tag) => Eq (CustomError tag) 
Instance details

Defined in Lorentz.Errors

Methods

(==) :: CustomError tag -> CustomError tag -> Bool #

(/=) :: CustomError tag -> CustomError tag -> Bool #

Eq (Label name) 
Instance details

Defined in Util.Label

Methods

(==) :: Label name -> Label name -> Bool #

(/=) :: Label name -> Label name -> Bool #

Eq (ContractRef arg) 
Instance details

Defined in Michelson.Typed.Haskell.Value

Methods

(==) :: ContractRef arg -> ContractRef arg -> Bool #

(/=) :: ContractRef arg -> ContractRef arg -> Bool #

Eq t => Eq (ErrorItem t) 
Instance details

Defined in Text.Megaparsec.Error

Methods

(==) :: ErrorItem t -> ErrorItem t -> Bool #

(/=) :: ErrorItem t -> ErrorItem t -> Bool #

Eq e => Eq (ErrorFancy e) 
Instance details

Defined in Text.Megaparsec.Error

Methods

(==) :: ErrorFancy e -> ErrorFancy e -> Bool #

(/=) :: ErrorFancy e -> ErrorFancy e -> Bool #

Eq s => Eq (PosState s) 
Instance details

Defined in Text.Megaparsec.State

Methods

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

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

Eq (HST ts) 
Instance details

Defined in Michelson.TypeCheck.Types

Methods

(==) :: HST ts -> HST ts -> Bool #

(/=) :: HST ts -> HST ts -> Bool #

Eq (StackRef st) 
Instance details

Defined in Michelson.Typed.Instr

Methods

(==) :: StackRef st -> StackRef st -> Bool #

(/=) :: StackRef st -> StackRef st -> Bool #

Eq (PrintComment st) 
Instance details

Defined in Michelson.Typed.Instr

Methods

(==) :: PrintComment st -> PrintComment st -> Bool #

(/=) :: PrintComment st -> PrintComment st -> Bool #

Eq (Operation' instr) 
Instance details

Defined in Michelson.Typed.Value

Methods

(==) :: Operation' instr -> Operation' instr -> Bool #

(/=) :: Operation' instr -> Operation' instr -> Bool #

Eq (SomeValue' instr) 
Instance details

Defined in Michelson.Typed.Value

Methods

(==) :: SomeValue' instr -> SomeValue' instr -> Bool #

(/=) :: SomeValue' instr -> SomeValue' instr -> Bool #

Eq (SomeEntryPointCallT arg) 
Instance details

Defined in Michelson.Typed.EntryPoints

Eq (ParamNotes t) 
Instance details

Defined in Michelson.Typed.EntryPoints

Methods

(==) :: ParamNotes t -> ParamNotes t -> Bool #

(/=) :: ParamNotes t -> ParamNotes t -> Bool #

Eq op => Eq (InstrAbstract op) 
Instance details

Defined in Michelson.Untyped.Instr

Eq op => Eq (Value' op) 
Instance details

Defined in Michelson.Untyped.Value

Methods

(==) :: Value' op -> Value' op -> Bool #

(/=) :: Value' op -> Value' op -> Bool #

Eq op => Eq (Elt op) 
Instance details

Defined in Michelson.Untyped.Value

Methods

(==) :: Elt op -> Elt op -> Bool #

(/=) :: Elt op -> Elt op -> Bool #

Eq (SingNat n) 
Instance details

Defined in Util.Peano

Methods

(==) :: SingNat n -> SingNat n -> Bool #

(/=) :: SingNat n -> SingNat n -> Bool #

Eq op => Eq (ContractBlock op) 
Instance details

Defined in Michelson.Untyped.Contract

Eq op => Eq (Contract' op) 
Instance details

Defined in Michelson.Untyped.Contract

Methods

(==) :: Contract' op -> Contract' op -> Bool #

(/=) :: Contract' op -> Contract' op -> Bool #

Eq op => Eq (ExtInstrAbstract op) 
Instance details

Defined in Michelson.Untyped.Ext

Eq op => Eq (TestAssert op) 
Instance details

Defined in Michelson.Untyped.Ext

Methods

(==) :: TestAssert op -> TestAssert op -> Bool #

(/=) :: TestAssert op -> TestAssert op -> Bool #

Eq (Doc a) 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Methods

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

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

Eq a => Eq (AnnotDetails a) 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Eq a => Eq (Span a) 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Methods

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

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

(Eq a, Prim a) => Eq (PrimArray a)

Since: primitive-0.6.4.0

Instance details

Defined in Data.Primitive.PrimArray

Methods

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

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

Eq a => Eq (SmallArray a) 
Instance details

Defined in Data.Primitive.SmallArray

Methods

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

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

Eq a => Eq (Array a) 
Instance details

Defined in Data.Primitive.Array

Methods

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

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

Eq a => Eq (Identity a) 
Instance details

Defined in Data.Vinyl.Functor

Methods

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

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

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

Defined in Data.Vinyl.Functor

Methods

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

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

Class (Eq a) (Ord a) 
Instance details

Defined in Data.Constraint

Methods

cls :: Ord a :- Eq a #

Class (Eq a) (Bits a) 
Instance details

Defined in Data.Constraint

Methods

cls :: Bits a :- Eq a #

(Eq a) :=> (Eq [a]) 
Instance details

Defined in Data.Constraint

Methods

ins :: Eq a :- Eq [a] #

(Eq a) :=> (Eq (Maybe a)) 
Instance details

Defined in Data.Constraint

Methods

ins :: Eq a :- Eq (Maybe a) #

(Eq a) :=> (Eq (Complex a)) 
Instance details

Defined in Data.Constraint

Methods

ins :: Eq a :- Eq (Complex a) #

(Eq a) :=> (Eq (Ratio a)) 
Instance details

Defined in Data.Constraint

Methods

ins :: Eq a :- Eq (Ratio a) #

(Eq a) :=> (Eq (Identity a)) 
Instance details

Defined in Data.Constraint

Methods

ins :: Eq a :- Eq (Identity a) #

(Eq a) :=> (Eq (Const a b)) 
Instance details

Defined in Data.Constraint

Methods

ins :: Eq a :- Eq (Const a b) #

Eq (ErrorArg tag) => Eq (() -> CustomError tag) 
Instance details

Defined in Lorentz.Errors

Methods

(==) :: (() -> CustomError tag) -> (() -> CustomError tag) -> Bool #

(/=) :: (() -> CustomError tag) -> (() -> CustomError tag) -> Bool #

(Eq a, Eq b) => Eq (Either a b)

Since: base-2.1

Instance details

Defined in Data.Either

Methods

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

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

Eq (V1 p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

(==) :: V1 p -> V1 p -> Bool #

(/=) :: V1 p -> V1 p -> Bool #

Eq (U1 p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

(==) :: U1 p -> U1 p -> Bool #

(/=) :: U1 p -> U1 p -> Bool #

Eq (TypeRep a)

Since: base-2.1

Instance details

Defined in Data.Typeable.Internal

Methods

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

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

(Eq a, Eq b) => Eq (a, b) 
Instance details

Defined in GHC.Classes

Methods

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

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

(Eq k, Eq v) => Eq (HashMap k v) 
Instance details

Defined in Data.HashMap.Base

Methods

(==) :: HashMap k v -> HashMap k v -> Bool #

(/=) :: HashMap k v -> HashMap k v -> Bool #

(Eq k, Eq a) => Eq (Map k a) 
Instance details

Defined in Data.Map.Internal

Methods

(==) :: Map k a -> Map k a -> Bool #

(/=) :: Map k a -> Map k a -> Bool #

Eq a => Eq (Arg a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

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

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

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 #

(Eq a, Eq b) => Eq (Bimap a b) 
Instance details

Defined in Data.Bimap

Methods

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

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

Eq (a :- b)

Assumes IncoherentInstances doesn't exist.

Instance details

Defined in Data.Constraint

Methods

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

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

(Eq1 m, Eq a) => Eq (MaybeT m a) 
Instance details

Defined in Control.Monad.Trans.Maybe

Methods

(==) :: MaybeT m a -> MaybeT m a -> Bool #

(/=) :: MaybeT m a -> MaybeT m a -> Bool #

(Eq1 f, Eq a) => Eq (Cofree f a) 
Instance details

Defined in Control.Comonad.Cofree

Methods

(==) :: Cofree f a -> Cofree f a -> Bool #

(/=) :: Cofree f a -> Cofree f a -> Bool #

(Eq1 f, Eq a) => Eq (Free f a) 
Instance details

Defined in Control.Monad.Free

Methods

(==) :: Free f a -> Free f a -> Bool #

(/=) :: Free f a -> Free f a -> Bool #

(Eq1 f, Eq a) => Eq (Yoneda f a) 
Instance details

Defined in Data.Functor.Yoneda

Methods

(==) :: Yoneda f a -> Yoneda f a -> Bool #

(/=) :: Yoneda f a -> Yoneda f a -> Bool #

Eq a => Eq (View a r) 
Instance details

Defined in Lorentz.Macro

Methods

(==) :: View a r -> View a r -> Bool #

(/=) :: View a r -> View a r -> Bool #

(Eq k, Eq v) => Eq (k |~> v) 
Instance details

Defined in Lorentz.UStore.Types

Methods

(==) :: (k |~> v) -> (k |~> v) -> Bool #

(/=) :: (k |~> v) -> (k |~> v) -> Bool #

Eq v => Eq (UStoreFieldExt m v) 
Instance details

Defined in Lorentz.UStore.Types

Eq (inp :-> out) 
Instance details

Defined in Lorentz.Base

Methods

(==) :: (inp :-> out) -> (inp :-> out) -> Bool #

(/=) :: (inp :-> out) -> (inp :-> out) -> Bool #

(Eq k, Eq v) => Eq (BigMap k v) 
Instance details

Defined in Michelson.Typed.Haskell.Value

Methods

(==) :: BigMap k v -> BigMap k v -> Bool #

(/=) :: BigMap k v -> BigMap k v -> Bool #

(Eq s, Eq (Token s), Eq e) => Eq (ParseErrorBundle s e) 
Instance details

Defined in Text.Megaparsec.Error

(Eq (ParseError s e), Eq s) => Eq (State s e) 
Instance details

Defined in Text.Megaparsec.State

Methods

(==) :: State s e -> State s e -> Bool #

(/=) :: State s e -> State s e -> Bool #

(Eq (Token s), Eq e) => Eq (ParseError s e) 
Instance details

Defined in Text.Megaparsec.Error

Methods

(==) :: ParseError s e -> ParseError s e -> Bool #

(/=) :: ParseError s e -> ParseError s e -> Bool #

Eq (ContractCode cp st) => Eq (Contract cp st) 
Instance details

Defined in Michelson.Typed.Instr

Methods

(==) :: Contract cp st -> Contract cp st -> Bool #

(/=) :: Contract cp st -> Contract cp st -> Bool #

(Eq n, Eq m) => Eq (ArithError n m) 
Instance details

Defined in Michelson.Typed.Arith

Methods

(==) :: ArithError n m -> ArithError n m -> Bool #

(/=) :: ArithError n m -> ArithError n m -> Bool #

Eq (TransferTokens instr p) 
Instance details

Defined in Michelson.Typed.Value

Methods

(==) :: TransferTokens instr p -> TransferTokens instr p -> Bool #

(/=) :: TransferTokens instr p -> TransferTokens instr p -> Bool #

Eq (Value' instr t) 
Instance details

Defined in Michelson.Typed.Value

Methods

(==) :: Value' instr t -> Value' instr t -> Bool #

(/=) :: Value' instr t -> Value' instr t -> Bool #

Eq (EntryPointCallT param arg) 
Instance details

Defined in Michelson.Typed.EntryPoints

Methods

(==) :: EntryPointCallT param arg -> EntryPointCallT param arg -> Bool #

(/=) :: EntryPointCallT param arg -> EntryPointCallT param arg -> Bool #

Eq (EpLiftSequence arg param) 
Instance details

Defined in Michelson.Typed.EntryPoints

Methods

(==) :: EpLiftSequence arg param -> EpLiftSequence arg param -> Bool #

(/=) :: EpLiftSequence arg param -> EpLiftSequence arg param -> Bool #

Eq (Annotation tag) 
Instance details

Defined in Michelson.Untyped.Annotation

Methods

(==) :: Annotation tag -> Annotation tag -> Bool #

(/=) :: Annotation tag -> Annotation tag -> Bool #

Eq (SmallMutableArray s a) 
Instance details

Defined in Data.Primitive.SmallArray

Eq (MutableArray s a) 
Instance details

Defined in Data.Primitive.Array

Methods

(==) :: MutableArray s a -> MutableArray s a -> Bool #

(/=) :: MutableArray s a -> MutableArray s a -> Bool #

(Eq k, Eq v) => Eq (Leaf k v) 
Instance details

Defined in Data.HashMap.Base

Methods

(==) :: Leaf k v -> Leaf k v -> Bool #

(/=) :: Leaf k v -> Leaf k v -> Bool #

(Eq a, Eq b) :=> (Eq (a, b)) 
Instance details

Defined in Data.Constraint

Methods

ins :: (Eq a, Eq b) :- Eq (a, b) #

(Eq a, Eq b) :=> (Eq (Either a b)) 
Instance details

Defined in Data.Constraint

Methods

ins :: (Eq a, Eq b) :- Eq (Either a b) #

Eq (f p) => Eq (Rec1 f p)

Since: base-4.7.0.0

Instance details

Defined in GHC.Generics

Methods

(==) :: Rec1 f p -> Rec1 f p -> Bool #

(/=) :: Rec1 f p -> Rec1 f p -> Bool #

Eq (URec (Ptr ()) p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

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

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

Eq (URec Char p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

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

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

Eq (URec Double p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

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

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

Eq (URec Float p) 
Instance details

Defined in GHC.Generics

Methods

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

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

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 #

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 #

(Eq a, Eq b, Eq c) => Eq (a, b, c) 
Instance details

Defined in GHC.Classes

Methods

(==) :: (a, b, c) -> (a, b, c) -> Bool #

(/=) :: (a, b, c) -> (a, b, c) -> Bool #

Eq a => Eq (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Methods

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

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

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 #

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 #

Eq (Coercion a b)

Since: base-4.7.0.0

Instance details

Defined in Data.Type.Coercion

Methods

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

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

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 #

Eq (p a a) => Eq (Join p a) 
Instance details

Defined in Data.Bifunctor.Join

Methods

(==) :: Join p a -> Join p a -> Bool #

(/=) :: Join p a -> Join p a -> Bool #

Eq (p (Fix p a) a) => Eq (Fix p a) 
Instance details

Defined in Data.Bifunctor.Fix

Methods

(==) :: Fix p a -> Fix p a -> Bool #

(/=) :: Fix p a -> Fix p a -> Bool #

(Eq1 f, Eq a) => Eq (IdentityT f a) 
Instance details

Defined in Control.Monad.Trans.Identity

Methods

(==) :: IdentityT f a -> IdentityT f a -> Bool #

(/=) :: IdentityT f a -> IdentityT f a -> Bool #

(Eq e, Eq1 m, Eq a) => Eq (ExceptT e m a) 
Instance details

Defined in Control.Monad.Trans.Except

Methods

(==) :: ExceptT e m a -> ExceptT e m a -> Bool #

(/=) :: ExceptT e m a -> ExceptT e m a -> Bool #

(Eq a, Eq (f b)) => Eq (FreeF f a b) 
Instance details

Defined in Control.Monad.Trans.Free

Methods

(==) :: FreeF f a b -> FreeF f a b -> Bool #

(/=) :: FreeF f a b -> FreeF f a b -> Bool #

(Eq1 f, Eq1 m, Eq a) => Eq (FreeT f m a) 
Instance details

Defined in Control.Monad.Trans.Free

Methods

(==) :: FreeT f m a -> FreeT f m a -> Bool #

(/=) :: FreeT f m a -> FreeT f m a -> Bool #

(Eq a, Eq (f b)) => Eq (CofreeF f a b) 
Instance details

Defined in Control.Comonad.Trans.Cofree

Methods

(==) :: CofreeF f a b -> CofreeF f a b -> Bool #

(/=) :: CofreeF f a b -> CofreeF f a b -> Bool #

Eq (w (CofreeF f a (CofreeT f w a))) => Eq (CofreeT f w a) 
Instance details

Defined in Control.Comonad.Trans.Cofree

Methods

(==) :: CofreeT f w a -> CofreeT f w a -> Bool #

(/=) :: CofreeT f w a -> CofreeT f w a -> Bool #

(Eq e, Eq1 m, Eq a) => Eq (ErrorT e m a) 
Instance details

Defined in Control.Monad.Trans.Error

Methods

(==) :: ErrorT e m a -> ErrorT e m a -> Bool #

(/=) :: ErrorT e m a -> ErrorT e m a -> Bool #

Eq (Rec f ('[] :: [u])) 
Instance details

Defined in Data.Vinyl.Core

Methods

(==) :: Rec f '[] -> Rec f '[] -> Bool #

(/=) :: Rec f '[] -> Rec f '[] -> Bool #

(Eq (f r), Eq (Rec f rs)) => Eq (Rec f (r ': rs)) 
Instance details

Defined in Data.Vinyl.Core

Methods

(==) :: Rec f (r ': rs) -> Rec f (r ': rs) -> Bool #

(/=) :: Rec f (r ': rs) -> Rec f (r ': rs) -> Bool #

Eq (CreateContract instr cp st) 
Instance details

Defined in Michelson.Typed.Value

Methods

(==) :: CreateContract instr cp st -> CreateContract instr cp st -> Bool #

(/=) :: CreateContract instr cp st -> CreateContract instr cp st -> Bool #

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 #

(RPureConstrained (IndexableField rs) rs, RecApplicative rs, Eq (Rec f rs)) => Eq (ARec f rs) 
Instance details

Defined in Data.Vinyl.ARec

Methods

(==) :: ARec f rs -> ARec f rs -> Bool #

(/=) :: ARec f rs -> ARec f rs -> Bool #

Eq a => Eq (Const a b) 
Instance details

Defined in Data.Vinyl.Functor

Methods

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

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

Eq c => Eq (K1 i c p)

Since: base-4.7.0.0

Instance details

Defined in GHC.Generics

Methods

(==) :: K1 i c p -> K1 i c p -> Bool #

(/=) :: K1 i c p -> K1 i c p -> Bool #

(Eq (f p), Eq (g p)) => Eq ((f :+: g) p)

Since: base-4.7.0.0

Instance details

Defined in GHC.Generics

Methods

(==) :: (f :+: g) p -> (f :+: g) p -> Bool #

(/=) :: (f :+: g) p -> (f :+: g) p -> Bool #

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

Since: base-4.7.0.0

Instance details

Defined in GHC.Generics

Methods

(==) :: (f :*: g) p -> (f :*: g) p -> Bool #

(/=) :: (f :*: g) p -> (f :*: g) p -> Bool #

(Eq a, Eq b, Eq c, Eq d) => Eq (a, b, c, d) 
Instance details

Defined in GHC.Classes

Methods

(==) :: (a, b, c, d) -> (a, b, c, d) -> Bool #

(/=) :: (a, b, c, d) -> (a, b, c, d) -> Bool #

(Eq1 f, Eq1 g, Eq a) => Eq (Product f g a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Product

Methods

(==) :: Product f g a -> Product f g a -> Bool #

(/=) :: Product f g a -> Product f g a -> Bool #

(Eq1 f, Eq1 g, Eq a) => Eq (Sum f g a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Sum

Methods

(==) :: Sum f g a -> Sum f g a -> Bool #

(/=) :: Sum f g a -> Sum f g a -> Bool #

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 #

Eq (instr i o) => Eq (RemFail instr i o)

Ignoring distinction between constructors here, comparing only semantics.

Instance details

Defined in Michelson.Typed.Value

Methods

(==) :: RemFail instr i o -> RemFail instr i o -> Bool #

(/=) :: RemFail instr i o -> RemFail instr i o -> Bool #

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

Since: base-4.7.0.0

Instance details

Defined in GHC.Generics

Methods

(==) :: M1 i c f p -> M1 i c f p -> Bool #

(/=) :: M1 i c f p -> M1 i c f p -> Bool #

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

Since: base-4.7.0.0

Instance details

Defined in GHC.Generics

Methods

(==) :: (f :.: g) p -> (f :.: g) p -> Bool #

(/=) :: (f :.: g) p -> (f :.: g) p -> Bool #

(Eq a, Eq b, Eq c, Eq d, Eq e) => Eq (a, b, c, d, e) 
Instance details

Defined in GHC.Classes

Methods

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

(/=) :: (a, b, c, d, e) -> (a, b, c, d, e) -> Bool #

(Eq1 f, Eq1 g, Eq a) => Eq (Compose f g a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Compose

Methods

(==) :: Compose f g a -> Compose f g a -> Bool #

(/=) :: Compose f g a -> Compose f g a -> Bool #

Eq (p a b) => Eq (WrappedBifunctor p a b) 
Instance details

Defined in Data.Bifunctor.Wrapped

Methods

(==) :: WrappedBifunctor p a b -> WrappedBifunctor p a b -> Bool #

(/=) :: WrappedBifunctor p a b -> WrappedBifunctor p a b -> Bool #

Eq (g b) => Eq (Joker g a b) 
Instance details

Defined in Data.Bifunctor.Joker

Methods

(==) :: Joker g a b -> Joker g a b -> Bool #

(/=) :: Joker g a b -> Joker g a b -> Bool #

Eq (p b a) => Eq (Flip p a b) 
Instance details

Defined in Data.Bifunctor.Flip

Methods

(==) :: Flip p a b -> Flip p a b -> Bool #

(/=) :: Flip p a b -> Flip p a b -> Bool #

Eq (f a) => Eq (Clown f a b) 
Instance details

Defined in Data.Bifunctor.Clown

Methods

(==) :: Clown f a b -> Clown f a b -> Bool #

(/=) :: Clown f a b -> Clown f a b -> Bool #

(Eq a, Eq b, Eq c, Eq d, Eq e, Eq f) => Eq (a, b, c, d, e, f) 
Instance details

Defined in GHC.Classes

Methods

(==) :: (a, b, c, d, e, f) -> (a, b, c, d, e, f) -> Bool #

(/=) :: (a, b, c, d, e, f) -> (a, b, c, d, e, f) -> Bool #

(Eq (p a b), Eq (q a b)) => Eq (Sum p q a b) 
Instance details

Defined in Data.Bifunctor.Sum

Methods

(==) :: Sum p q a b -> Sum p q a b -> Bool #

(/=) :: Sum p q a b -> Sum p q a b -> Bool #

(Eq (f a b), Eq (g a b)) => Eq (Product f g a b) 
Instance details

Defined in Data.Bifunctor.Product

Methods

(==) :: Product f g a b -> Product f g a b -> Bool #

(/=) :: Product f g a b -> Product f g a b -> Bool #

(Eq a, Eq b, Eq c, Eq d, Eq e, Eq f, Eq g) => Eq (a, b, c, d, e, f, g) 
Instance details

Defined in GHC.Classes

Methods

(==) :: (a, b, c, d, e, f, g) -> (a, b, c, d, e, f, g) -> Bool #

(/=) :: (a, b, c, d, e, f, g) -> (a, b, c, d, e, f, g) -> Bool #

Eq (f (p a b)) => Eq (Tannen f p a b) 
Instance details

Defined in Data.Bifunctor.Tannen

Methods

(==) :: Tannen f p a b -> Tannen f p a b -> Bool #

(/=) :: Tannen f p a b -> Tannen f p a b -> Bool #

(Eq a, Eq b, Eq c, Eq d, Eq e, Eq f, Eq g, Eq h) => Eq (a, b, c, d, e, f, g, h) 
Instance details

Defined in GHC.Classes

Methods

(==) :: (a, b, c, d, e, f, g, h) -> (a, b, c, d, e, f, g, h) -> Bool #

(/=) :: (a, b, c, d, e, f, g, h) -> (a, b, c, d, e, f, g, h) -> Bool #

(Eq a, Eq b, Eq c, Eq d, Eq e, Eq f, Eq g, Eq h, Eq i) => Eq (a, b, c, d, e, f, g, h, i) 
Instance details

Defined in GHC.Classes

Methods

(==) :: (a, b, c, d, e, f, g, h, i) -> (a, b, c, d, e, f, g, h, i) -> Bool #

(/=) :: (a, b, c, d, e, f, g, h, i) -> (a, b, c, d, e, f, g, h, i) -> Bool #

Eq (p (f a) (g b)) => Eq (Biff p f g a b) 
Instance details

Defined in Data.Bifunctor.Biff

Methods

(==) :: Biff p f g a b -> Biff p f g a b -> Bool #

(/=) :: Biff p f g a b -> Biff p f g a b -> Bool #

(Eq a, Eq b, Eq c, Eq d, Eq e, Eq f, Eq g, Eq h, Eq i, Eq j) => Eq (a, b, c, d, e, f, g, h, i, j) 
Instance details

Defined in GHC.Classes

Methods

(==) :: (a, b, c, d, e, f, g, h, i, j) -> (a, b, c, d, e, f, g, h, i, j) -> Bool #

(/=) :: (a, b, c, d, e, f, g, h, i, j) -> (a, b, c, d, e, f, g, h, i, j) -> Bool #

(Eq a, Eq b, Eq c, Eq d, Eq e, Eq f, Eq g, Eq h, Eq i, Eq j, Eq k) => Eq (a, b, c, d, e, f, g, h, i, j, k) 
Instance details

Defined in GHC.Classes

Methods

(==) :: (a, b, c, d, e, f, g, h, i, j, k) -> (a, b, c, d, e, f, g, h, i, j, k) -> Bool #

(/=) :: (a, b, c, d, e, f, g, h, i, j, k) -> (a, b, c, d, e, f, g, h, i, j, k) -> Bool #

(Eq a, Eq b, Eq c, Eq d, Eq e, Eq f, Eq g, Eq h, Eq i, Eq j, Eq k, Eq l) => Eq (a, b, c, d, e, f, g, h, i, j, k, l) 
Instance details

Defined in GHC.Classes

Methods

(==) :: (a, b, c, d, e, f, g, h, i, j, k, l) -> (a, b, c, d, e, f, g, h, i, j, k, l) -> Bool #

(/=) :: (a, b, c, d, e, f, g, h, i, j, k, l) -> (a, b, c, d, e, f, g, h, i, j, k, l) -> Bool #

(Eq a, Eq b, Eq c, Eq d, Eq e, Eq f, Eq g, Eq h, Eq i, Eq j, Eq k, Eq l, Eq m) => Eq (a, b, c, d, e, f, g, h, i, j, k, l, m) 
Instance details

Defined in GHC.Classes

Methods

(==) :: (a, b, c, d, e, f, g, h, i, j, k, l, m) -> (a, b, c, d, e, f, g, h, i, j, k, l, m) -> Bool #

(/=) :: (a, b, c, d, e, f, g, h, i, j, k, l, m) -> (a, b, c, d, e, f, g, h, i, j, k, l, m) -> Bool #

(Eq a, Eq b, Eq c, Eq d, Eq e, Eq f, Eq g, Eq h, Eq i, Eq j, Eq k, Eq l, Eq m, Eq n) => Eq (a, b, c, d, e, f, g, h, i, j, k, l, m, n) 
Instance details

Defined in GHC.Classes

Methods

(==) :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n) -> Bool #

(/=) :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n) -> Bool #

(Eq a, Eq b, Eq c, Eq d, Eq e, Eq f, Eq g, Eq h, Eq i, Eq j, Eq k, Eq l, Eq m, Eq n, Eq o) => Eq (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) 
Instance details

Defined in GHC.Classes

Methods

(==) :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) -> Bool #

(/=) :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) -> Bool #

class Fractional a => Floating a where #

Trigonometric and hyperbolic functions and related functions.

The Haskell Report defines no laws for Floating. However, (+), (*) and exp are customarily expected to define an exponential field and have the following properties:

  • exp (a + b) = exp a * exp b
  • exp (fromInteger 0) = fromInteger 1

Minimal complete definition

pi, exp, log, sin, cos, asin, acos, atan, sinh, cosh, asinh, acosh, atanh

Methods

pi :: a #

exp :: a -> a #

sqrt :: a -> a #

(**) :: a -> a -> a infixr 8 #

logBase :: a -> a -> a #

sin :: a -> a #

cos :: a -> a #

tan :: a -> a #

asin :: a -> a #

acos :: a -> a #

atan :: a -> a #

sinh :: a -> a #

cosh :: a -> a #

tanh :: a -> a #

asinh :: a -> a #

acosh :: a -> a #

atanh :: a -> a #

Instances

Instances details
Floating Double

Since: base-2.1

Instance details

Defined in GHC.Float

Floating Float

Since: base-2.1

Instance details

Defined in GHC.Float

() :=> (Floating Double) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Floating Double #

() :=> (Floating Float) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Floating Float #

RealFloat a => Floating (Complex a)

Since: base-2.1

Instance details

Defined in Data.Complex

Methods

pi :: Complex a #

exp :: Complex a -> Complex a #

log :: Complex a -> Complex a #

sqrt :: Complex a -> Complex a #

(**) :: Complex a -> Complex a -> Complex a #

logBase :: Complex a -> Complex a -> Complex a #

sin :: Complex a -> Complex a #

cos :: Complex a -> Complex a #

tan :: Complex a -> Complex a #

asin :: Complex a -> Complex a #

acos :: Complex a -> Complex a #

atan :: Complex a -> Complex a #

sinh :: Complex a -> Complex a #

cosh :: Complex a -> Complex a #

tanh :: Complex a -> Complex a #

asinh :: Complex a -> Complex a #

acosh :: Complex a -> Complex a #

atanh :: Complex a -> Complex a #

log1p :: Complex a -> Complex a #

expm1 :: Complex a -> Complex a #

log1pexp :: Complex a -> Complex a #

log1mexp :: Complex a -> Complex a #

Floating a => Floating (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

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

Defined in Data.Vinyl.Functor

Methods

pi :: ElField '(s, t) #

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

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

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

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

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

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

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

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

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

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

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

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

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

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

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

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

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

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

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

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

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

Class (Fractional a) (Floating a) 
Instance details

Defined in Data.Constraint

Methods

cls :: Floating a :- Fractional a #

(Floating a) :=> (Floating (Identity a)) 
Instance details

Defined in Data.Constraint

Methods

ins :: Floating a :- Floating (Identity a) #

(Floating a) :=> (Floating (Const a b)) 
Instance details

Defined in Data.Constraint

Methods

ins :: Floating a :- Floating (Const a b) #

(RealFloat a) :=> (Floating (Complex a)) 
Instance details

Defined in Data.Constraint

Methods

ins :: RealFloat a :- Floating (Complex a) #

Class (RealFrac a, Floating a) (RealFloat a) 
Instance details

Defined in Data.Constraint

Methods

cls :: RealFloat a :- (RealFrac a, Floating a) #

Floating a => Floating (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Methods

pi :: Const a b #

exp :: Const a b -> Const a b #

log :: Const a b -> Const a b #

sqrt :: Const a b -> Const a b #

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

logBase :: Const a b -> Const a b -> Const a b #

sin :: Const a b -> Const a b #

cos :: Const a b -> Const a b #

tan :: Const a b -> Const a b #

asin :: Const a b -> Const a b #

acos :: Const a b -> Const a b #

atan :: Const a b -> Const a b #

sinh :: Const a b -> Const a b #

cosh :: Const a b -> Const a b #

tanh :: Const a b -> Const a b #

asinh :: Const a b -> Const a b #

acosh :: Const a b -> Const a b #

atanh :: Const a b -> Const a b #

log1p :: Const a b -> Const a b #

expm1 :: Const a b -> Const a b #

log1pexp :: Const a b -> Const a b #

log1mexp :: Const a b -> Const a b #

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 #

class Num a => Fractional a where #

Fractional numbers, supporting real division.

The Haskell Report defines no laws for Fractional. However, (+) and (*) are customarily expected to define a division ring and have the following properties:

recip gives the multiplicative inverse
x * recip x = recip x * x = fromInteger 1

Note that it isn't customarily expected that a type instance of Fractional implement a field. However, all instances in base do.

Minimal complete definition

fromRational, (recip | (/))

Methods

recip :: a -> a #

Reciprocal fraction.

fromRational :: Rational -> a #

Conversion from a Rational (that is Ratio Integer). A floating literal stands for an application of fromRational to a value of type Rational, so such literals have type (Fractional a) => a.

Instances

Instances details
Fractional Scientific

WARNING: recip and / will throw an error when their outputs are repeating decimals.

fromRational will throw an error when the input Rational is a repeating decimal. Consider using fromRationalRepetend for these rationals which will detect the repetition and indicate where it starts.

Instance details

Defined in Data.Scientific

() :=> (Fractional Double) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Fractional Double #

() :=> (Fractional Float) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Fractional Float #

Integral a => Fractional (Ratio a)

Since: base-2.0.1

Instance details

Defined in GHC.Real

Methods

(/) :: Ratio a -> Ratio a -> Ratio a #

recip :: Ratio a -> Ratio a #

fromRational :: Rational -> Ratio a #

RealFloat a => Fractional (Complex a)

Since: base-2.1

Instance details

Defined in Data.Complex

Methods

(/) :: Complex a -> Complex a -> Complex a #

recip :: Complex a -> Complex a #

fromRational :: Rational -> Complex a #

Fractional a => Fractional (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

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

Defined in Data.Vinyl.Functor

Methods

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

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

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

Class (Fractional a) (Floating a) 
Instance details

Defined in Data.Constraint

Methods

cls :: Floating a :- Fractional a #

Class (Num a) (Fractional a) 
Instance details

Defined in Data.Constraint

Methods

cls :: Fractional a :- Num a #

(Fractional a) :=> (Fractional (Identity a)) 
Instance details

Defined in Data.Constraint

(Fractional a) :=> (Fractional (Const a b)) 
Instance details

Defined in Data.Constraint

Methods

ins :: Fractional a :- Fractional (Const a b) #

(Integral a) :=> (Fractional (Ratio a)) 
Instance details

Defined in Data.Constraint

Methods

ins :: Integral a :- Fractional (Ratio a) #

(RealFloat a) :=> (Fractional (Complex a)) 
Instance details

Defined in Data.Constraint

Class (Real a, Fractional a) (RealFrac a) 
Instance details

Defined in Data.Constraint

Methods

cls :: RealFrac a :- (Real a, Fractional a) #

Fractional a => Fractional (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 #

recip :: Const a b -> Const a b #

fromRational :: Rational -> Const a b #

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 #

class (Real a, Enum a) => Integral a where #

Integral numbers, supporting integer division.

The Haskell Report defines no laws for Integral. However, Integral instances are customarily expected to define a Euclidean domain and have the following properties for the div/mod and quot/rem pairs, given suitable Euclidean functions f and g:

  • x = y * quot x y + rem x y with rem x y = fromInteger 0 or g (rem x y) < g y
  • x = y * div x y + mod x y with mod x y = fromInteger 0 or f (mod x y) < f y

An example of a suitable Euclidean function, for Integer's instance, is abs.

Minimal complete definition

quotRem, toInteger

Methods

quot :: a -> a -> a infixl 7 #

integer division truncated toward zero

rem :: a -> a -> a infixl 7 #

integer remainder, satisfying

(x `quot` y)*y + (x `rem` y) == x

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

simultaneous quot and rem

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

simultaneous div and mod

toInteger :: a -> Integer #

conversion to Integer

Instances

Instances details
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 #

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 #

Integral Int16

Since: base-2.1

Instance details

Defined in GHC.Int

Integral Int32

Since: base-2.1

Instance details

Defined in GHC.Int

Integral Int64

Since: base-2.1

Instance details

Defined in GHC.Int

Integral Integer

Since: base-2.0.1

Instance details

Defined in GHC.Real

Integral Natural

Since: base-4.8.0.0

Instance details

Defined in GHC.Real

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 #

Integral Word8

Since: base-2.1

Instance details

Defined in GHC.Word

Integral Word16

Since: base-2.1

Instance details

Defined in GHC.Word

Integral Word32

Since: base-2.1

Instance details

Defined in GHC.Word

Integral Word64

Since: base-2.1

Instance details

Defined in GHC.Word

() :=> (Integral Int) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Integral Int #

() :=> (Integral Integer) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Integral Integer #

() :=> (Integral Natural) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Integral Natural #

() :=> (Integral Word) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Integral Word #

Integral a => Integral (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

(Integral a) :=> (RealFrac (Ratio a)) 
Instance details

Defined in Data.Constraint

Methods

ins :: Integral a :- RealFrac (Ratio a) #

(Integral a) :=> (Real (Ratio a)) 
Instance details

Defined in Data.Constraint

Methods

ins :: Integral a :- Real (Ratio a) #

(Integral a) :=> (Ord (Ratio a)) 
Instance details

Defined in Data.Constraint

Methods

ins :: Integral a :- Ord (Ratio a) #

(Integral a) :=> (Num (Ratio a)) 
Instance details

Defined in Data.Constraint

Methods

ins :: Integral a :- Num (Ratio a) #

(Integral a) :=> (Integral (Identity a)) 
Instance details

Defined in Data.Constraint

Methods

ins :: Integral a :- Integral (Identity a) #

(Integral a) :=> (Integral (Const a b)) 
Instance details

Defined in Data.Constraint

Methods

ins :: Integral a :- Integral (Const a b) #

(Integral a) :=> (Fractional (Ratio a)) 
Instance details

Defined in Data.Constraint

Methods

ins :: Integral a :- Fractional (Ratio a) #

(Integral a) :=> (Enum (Ratio a)) 
Instance details

Defined in Data.Constraint

Methods

ins :: Integral a :- Enum (Ratio a) #

Class (Real a, Enum a) (Integral a) 
Instance details

Defined in Data.Constraint

Methods

cls :: Integral a :- (Real a, Enum a) #

(Integral a, Show a) :=> (Show (Ratio a)) 
Instance details

Defined in Data.Constraint

Methods

ins :: (Integral a, Show a) :- Show (Ratio a) #

(Integral a, Read a) :=> (Read (Ratio a)) 
Instance details

Defined in Data.Constraint

Methods

ins :: (Integral a, Read a) :- Read (Ratio a) #

Integral a => Integral (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Methods

quot :: Const a b -> Const a b -> Const a b #

rem :: Const a b -> Const a b -> Const a b #

div :: Const a b -> Const a b -> Const a b #

mod :: Const a b -> Const a b -> Const a b #

quotRem :: Const a b -> Const a b -> (Const a b, Const a b) #

divMod :: Const a b -> Const a b -> (Const a b, Const a b) #

toInteger :: Const a b -> Integer #

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 #

class Applicative m => Monad (m :: Type -> Type) where #

The Monad class defines the basic operations over a monad, a concept from a branch of mathematics known as category theory. From the perspective of a Haskell programmer, however, it is best to think of a monad as an abstract datatype of actions. Haskell's do expressions provide a convenient syntax for writing monadic expressions.

Instances of Monad should satisfy the following:

Left identity
return a >>= k = k a
Right identity
m >>= return = m
Associativity
m >>= (\x -> k x >>= h) = (m >>= k) >>= h

Furthermore, the Monad and Applicative operations should relate as follows:

The above laws imply:

and that pure and (<*>) satisfy the applicative functor laws.

The instances of Monad for lists, Maybe and IO defined in the Prelude satisfy these laws.

Minimal complete definition

(>>=)

Methods

(>>=) :: m a -> (a -> m b) -> m b infixl 1 #

Sequentially compose two actions, passing any value produced by the first as an argument to the second.

(>>) :: m a -> m b -> m b infixl 1 #

Sequentially compose two actions, discarding any value produced by the first, like sequencing operators (such as the semicolon) in imperative languages.

return :: a -> m a #

Inject a value into the monadic type.

Instances

Instances details
Monad []

Since: base-2.1

Instance details

Defined in GHC.Base

Methods

(>>=) :: [a] -> (a -> [b]) -> [b] #

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

return :: a -> [a] #

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 #

Monad IO

Since: base-2.1

Instance details

Defined in GHC.Base

Methods

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

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

return :: a -> IO a #

Monad Par1

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

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

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

return :: a -> Par1 a #

Monad Q 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

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

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

return :: a -> Q a #

Monad IResult 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

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

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

return :: a -> IResult a #

Monad Result 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

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

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

return :: a -> Result a #

Monad Parser 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

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

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

return :: a -> Parser a #

Monad Complex

Since: base-4.9.0.0

Instance details

Defined in Data.Complex

Methods

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

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

return :: a -> Complex a #

Monad Min

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

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

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

return :: a -> Min a #

Monad Max

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

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

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

return :: a -> Max a #

Monad First

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

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

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

return :: a -> First a #

Monad Last

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

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

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

return :: a -> Last a #

Monad Option

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

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

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

return :: a -> Option a #

Monad Identity

Since: base-4.8.0.0

Instance details

Defined in Data.Functor.Identity

Methods

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

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

return :: a -> Identity a #

Monad STM

Since: base-4.3.0.0

Instance details

Defined in GHC.Conc.Sync

Methods

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

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

return :: a -> STM a #

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 #

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 #

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 #

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 #

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 #

Monad Down

Since: base-4.11.0.0

Instance details

Defined in Data.Ord

Methods

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

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

return :: a -> Down a #

Monad ReadP

Since: base-2.1

Instance details

Defined in Text.ParserCombinators.ReadP

Methods

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

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

return :: a -> ReadP a #

Monad NonEmpty

Since: base-4.9.0.0

Instance details

Defined in GHC.Base

Methods

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

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

return :: a -> NonEmpty a #

Monad Put 
Instance details

Defined in Data.ByteString.Builder.Internal

Methods

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

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

return :: a -> Put a #

Monad Tree 
Instance details

Defined in Data.Tree

Methods

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

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

return :: a -> Tree a #

Monad Seq 
Instance details

Defined in Data.Sequence.Internal

Methods

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

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

return :: a -> Seq a #

Monad CryptoFailable 
Instance details

Defined in Crypto.Error.Types

Monad DList 
Instance details

Defined in Data.DList

Methods

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

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

return :: a -> DList a #

Monad Vector 
Instance details

Defined in Data.Vector

Methods

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

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

return :: a -> Vector a #

Monad SmallArray 
Instance details

Defined in Data.Primitive.SmallArray

Methods

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

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

return :: a -> SmallArray a #

Monad Array 
Instance details

Defined in Data.Primitive.Array

Methods

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

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

return :: a -> Array a #

Monad Identity 
Instance details

Defined in Data.Vinyl.Functor

Methods

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

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

return :: a -> Identity a #

Monad Thunk 
Instance details

Defined in Data.Vinyl.Functor

Methods

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

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

return :: a -> Thunk a #

Monad P

Since: base-2.1

Instance details

Defined in Text.ParserCombinators.ReadP

Methods

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

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

return :: a -> P a #

Monad IndigoM Source # 
Instance details

Defined in Indigo.Frontend.Program

Methods

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

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

return :: a -> IndigoM a #

() :=> (Monad ((->) a :: Type -> Type)) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Monad ((->) a) #

() :=> (Monad []) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Monad [] #

() :=> (Monad IO) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Monad IO #

() :=> (Monad (Either a)) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Monad (Either a) #

() :=> (Monad Identity) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Monad Identity #

Monad (Either e)

Since: base-4.4.0.0

Instance details

Defined in Data.Either

Methods

(>>=) :: Either e a -> (a -> Either e b) -> Either e b #

(>>) :: Either e a -> Either e b -> Either e b #

return :: a -> Either e a #

Monad (U1 :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

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

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

return :: a -> U1 a #

Monoid a => Monad ((,) a)

Since: base-4.9.0.0

Instance details

Defined in GHC.Base

Methods

(>>=) :: (a, a0) -> (a0 -> (a, b)) -> (a, b) #

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

return :: a0 -> (a, a0) #

Representable f => Monad (Co f) 
Instance details

Defined in Data.Functor.Rep

Methods

(>>=) :: Co f a -> (a -> Co f b) -> Co f b #

(>>) :: Co f a -> Co f b -> Co f b #

return :: a -> Co f a #

Monad (Parser i) 
Instance details

Defined in Data.Attoparsec.Internal.Types

Methods

(>>=) :: Parser i a -> (a -> Parser i b) -> Parser i b #

(>>) :: Parser i a -> Parser i b -> Parser i b #

return :: a -> Parser i a #

Monad m => Monad (WrappedMonad m)

Since: base-4.7.0.0

Instance details

Defined in Control.Applicative

Methods

(>>=) :: WrappedMonad m a -> (a -> WrappedMonad m b) -> WrappedMonad m b #

(>>) :: WrappedMonad m a -> WrappedMonad m b -> WrappedMonad m b #

return :: a -> WrappedMonad m a #

ArrowApply a => Monad (ArrowMonad a)

Since: base-2.1

Instance details

Defined in Control.Arrow

Methods

(>>=) :: ArrowMonad a a0 -> (a0 -> ArrowMonad a b) -> ArrowMonad a b #

(>>) :: ArrowMonad a a0 -> ArrowMonad a b -> ArrowMonad a b #

return :: a0 -> ArrowMonad a a0 #

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 #

Monad m => Monad (MaybeT m) 
Instance details

Defined in Control.Monad.Trans.Maybe

Methods

(>>=) :: MaybeT m a -> (a -> MaybeT m b) -> MaybeT m b #

(>>) :: MaybeT m a -> MaybeT m b -> MaybeT m b #

return :: a -> MaybeT m a #

Alternative f => Monad (Cofree f) 
Instance details

Defined in Control.Comonad.Cofree

Methods

(>>=) :: Cofree f a -> (a -> Cofree f b) -> Cofree f b #

(>>) :: Cofree f a -> Cofree f b -> Cofree f b #

return :: a -> Cofree f a #

Functor f => Monad (Free f) 
Instance details

Defined in Control.Monad.Free

Methods

(>>=) :: Free f a -> (a -> Free f b) -> Free f b #

(>>) :: Free f a -> Free f b -> Free f b #

return :: a -> Free f a #

Monad m => Monad (Yoneda m) 
Instance details

Defined in Data.Functor.Yoneda

Methods

(>>=) :: Yoneda m a -> (a -> Yoneda m b) -> Yoneda m b #

(>>) :: Yoneda m a -> Yoneda m b -> Yoneda m b #

return :: a -> Yoneda m a #

Monad (ReifiedGetter s) 
Instance details

Defined in Control.Lens.Reified

Methods

(>>=) :: ReifiedGetter s a -> (a -> ReifiedGetter s b) -> ReifiedGetter s b #

(>>) :: ReifiedGetter s a -> ReifiedGetter s b -> ReifiedGetter s b #

return :: a -> ReifiedGetter s a #

Monad (ReifiedFold s) 
Instance details

Defined in Control.Lens.Reified

Methods

(>>=) :: ReifiedFold s a -> (a -> ReifiedFold s b) -> ReifiedFold s b #

(>>) :: ReifiedFold s a -> ReifiedFold s b -> ReifiedFold s b #

return :: a -> ReifiedFold s a #

(Monad (Rep p), Representable p) => Monad (Prep p) 
Instance details

Defined in Data.Profunctor.Rep

Methods

(>>=) :: Prep p a -> (a -> Prep p b) -> Prep p b #

(>>) :: Prep p a -> Prep p b -> Prep p b #

return :: a -> Prep p a #

Monad (Program instr) Source # 
Instance details

Defined in Indigo.Frontend.Program

Methods

(>>=) :: Program instr a -> (a -> Program instr b) -> Program instr b #

(>>) :: Program instr a -> Program instr b -> Program instr b #

return :: a -> Program instr a #

Class (Applicative f) (Monad f) 
Instance details

Defined in Data.Constraint

Methods

cls :: Monad f :- Applicative f #

(Monad m) :=> (Functor (WrappedMonad m)) 
Instance details

Defined in Data.Constraint

Methods

ins :: Monad m :- Functor (WrappedMonad m) #

(Monad m) :=> (Applicative (WrappedMonad m)) 
Instance details

Defined in Data.Constraint

Monad f => Monad (Rec1 f)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

(>>=) :: Rec1 f a -> (a -> Rec1 f b) -> Rec1 f b #

(>>) :: Rec1 f a -> Rec1 f b -> Rec1 f b #

return :: a -> Rec1 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 #

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 #

Monad m => Monad (IdentityT m) 
Instance details

Defined in Control.Monad.Trans.Identity

Methods

(>>=) :: IdentityT m a -> (a -> IdentityT m b) -> IdentityT m b #

(>>) :: IdentityT m a -> IdentityT m b -> IdentityT m b #

return :: a -> IdentityT m a #

(Applicative f, Monad f) => Monad (WhenMissing f x)

Equivalent to ReaderT k (ReaderT x (MaybeT f)).

Since: containers-0.5.9

Instance details

Defined in Data.IntMap.Internal

Methods

(>>=) :: WhenMissing f x a -> (a -> WhenMissing f x b) -> WhenMissing f x b #

(>>) :: WhenMissing f x a -> WhenMissing f x b -> WhenMissing f x b #

return :: a -> WhenMissing f x a #

Monad m => Monad (ExceptT e m) 
Instance details

Defined in Control.Monad.Trans.Except

Methods

(>>=) :: ExceptT e m a -> (a -> ExceptT e m b) -> ExceptT e m b #

(>>) :: ExceptT e m a -> ExceptT e m b -> ExceptT e m b #

return :: a -> ExceptT e m a #

(Functor f, Monad m) => Monad (FreeT f m) 
Instance details

Defined in Control.Monad.Trans.Free

Methods

(>>=) :: FreeT f m a -> (a -> FreeT f m b) -> FreeT f m b #

(>>) :: FreeT f m a -> FreeT f m b -> FreeT f m b #

return :: a -> FreeT f m a #

(Alternative f, Monad w) => Monad (CofreeT f w) 
Instance details

Defined in Control.Comonad.Trans.Cofree

Methods

(>>=) :: CofreeT f w a -> (a -> CofreeT f w b) -> CofreeT f w b #

(>>) :: CofreeT f w a -> CofreeT f w b -> CofreeT f w b #

return :: a -> CofreeT f w a #

(Monad m, Error e) => Monad (ErrorT e m) 
Instance details

Defined in Control.Monad.Trans.Error

Methods

(>>=) :: ErrorT e m a -> (a -> ErrorT e m b) -> ErrorT e m b #

(>>) :: ErrorT e m a -> ErrorT e m b -> ErrorT e m b #

return :: a -> ErrorT e m a #

Monad m => Monad (StateT s m) 
Instance details

Defined in Control.Monad.Trans.State.Strict

Methods

(>>=) :: StateT s m a -> (a -> StateT s m b) -> StateT s m b #

(>>) :: StateT s m a -> StateT s m b -> StateT s m b #

return :: a -> StateT s m a #

Monad (Indexed i a) 
Instance details

Defined in Control.Lens.Internal.Indexed

Methods

(>>=) :: Indexed i a a0 -> (a0 -> Indexed i a b) -> Indexed i a b #

(>>) :: Indexed i a a0 -> Indexed i a b -> Indexed i a b #

return :: a0 -> Indexed i a a0 #

Monad m => Monad (ReaderT r m) 
Instance details

Defined in Control.Monad.Trans.Reader

Methods

(>>=) :: ReaderT r m a -> (a -> ReaderT r m b) -> ReaderT r m b #

(>>) :: ReaderT r m a -> ReaderT r m b -> ReaderT r m b #

return :: a -> ReaderT r m 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 #

Monad m => Monad (StateT s m) 
Instance details

Defined in Lens.Micro

Methods

(>>=) :: StateT s m a -> (a -> StateT s m b) -> StateT s m b #

(>>) :: StateT s m a -> StateT s m b -> StateT s m b #

return :: a -> StateT s m a #

Class (Monad f, Alternative f) (MonadPlus f) 
Instance details

Defined in Data.Constraint

Methods

cls :: MonadPlus f :- (Monad f, Alternative f) #

Monad ((->) r :: Type -> Type)

Since: base-2.1

Instance details

Defined in GHC.Base

Methods

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

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

return :: a -> r -> a #

(Monad f, Monad g) => Monad (f :*: g)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

(>>=) :: (f :*: g) a -> (a -> (f :*: g) b) -> (f :*: g) b #

(>>) :: (f :*: g) a -> (f :*: g) b -> (f :*: g) b #

return :: a -> (f :*: g) a #

(Monad f, Monad g) => Monad (Product f g)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Product

Methods

(>>=) :: Product f g a -> (a -> Product f g b) -> Product f g b #

(>>) :: Product f g a -> Product f g b -> Product f g b #

return :: a -> Product f g a #

(Monad f, Applicative f) => Monad (WhenMatched f x y)

Equivalent to ReaderT Key (ReaderT x (ReaderT y (MaybeT f)))

Since: containers-0.5.9

Instance details

Defined in Data.IntMap.Internal

Methods

(>>=) :: WhenMatched f x y a -> (a -> WhenMatched f x y b) -> WhenMatched f x y b #

(>>) :: WhenMatched f x y a -> WhenMatched f x y b -> WhenMatched f x y b #

return :: a -> WhenMatched f x y a #

(Applicative f, Monad f) => Monad (WhenMissing f k x)

Equivalent to ReaderT k (ReaderT x (MaybeT f)) .

Since: containers-0.5.9

Instance details

Defined in Data.Map.Internal

Methods

(>>=) :: WhenMissing f k x a -> (a -> WhenMissing f k x b) -> WhenMissing f k x b #

(>>) :: WhenMissing f k x a -> WhenMissing f k x b -> WhenMissing f k x b #

return :: a -> WhenMissing f k x a #

Monad f => Monad (M1 i c f)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

(>>=) :: M1 i c f a -> (a -> M1 i c f b) -> M1 i c f b #

(>>) :: M1 i c f a -> M1 i c f b -> M1 i c f b #

return :: a -> M1 i c f a #

(Monad f, Applicative f) => Monad (WhenMatched f k x y)

Equivalent to ReaderT k (ReaderT x (ReaderT y (MaybeT f)))

Since: containers-0.5.9

Instance details

Defined in Data.Map.Internal

Methods

(>>=) :: WhenMatched f k x y a -> (a -> WhenMatched f k x y b) -> WhenMatched f k x y b #

(>>) :: WhenMatched f k x y a -> WhenMatched f k x y b -> WhenMatched f k x y b #

return :: a -> WhenMatched f k x y a #

Monad state => Monad (Builder collection mutCollection step state err) 
Instance details

Defined in Basement.MutableBuilder

Methods

(>>=) :: Builder collection mutCollection step state err a -> (a -> Builder collection mutCollection step state err b) -> Builder collection mutCollection step state err b #

(>>) :: Builder collection mutCollection step state err a -> Builder collection mutCollection step state err b -> Builder collection mutCollection step state err b #

return :: a -> Builder collection mutCollection step state err a #

class Functor (f :: Type -> Type) where #

A type f is a Functor if it provides a function fmap which, given any types a and b lets you apply any function from (a -> b) to turn an f a into an f b, preserving the structure of f. Furthermore f needs to adhere to the following:

Identity
fmap id == id
Composition
fmap (f . g) == fmap f . fmap g

Note, that the second law follows from the free theorem of the type fmap and the first law, so you need only check that the former condition holds.

Minimal complete definition

fmap

Methods

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

(<$) :: a -> f b -> f a infixl 4 #

Replace all locations in the input with the same value. The default definition is fmap . const, but this may be overridden with a more efficient version.

Instances

Instances details
Functor []

Since: base-2.1

Instance details

Defined in GHC.Base

Methods

fmap :: (a -> b) -> [a] -> [b] #

(<$) :: a -> [b] -> [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 #

Functor IO

Since: base-2.1

Instance details

Defined in GHC.Base

Methods

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

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

Functor Par1

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

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

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

Functor Q 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

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

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

Functor IResult 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

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

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

Functor Result 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

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

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

Functor Parser 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

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

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

Functor Complex

Since: base-4.9.0.0

Instance details

Defined in Data.Complex

Methods

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

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

Functor Min

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

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

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

Functor Max

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

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

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

Functor First

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

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

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

Functor Last

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

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

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

Functor Option

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

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

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

Functor ZipList

Since: base-2.1

Instance details

Defined in Control.Applicative

Methods

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

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

Functor Identity

Since: base-4.8.0.0

Instance details

Defined in Data.Functor.Identity

Methods

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

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

Functor Handler

Since: base-4.6.0.0

Instance details

Defined in Control.Exception

Methods

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

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

Functor STM

Since: base-4.3.0.0

Instance details

Defined in GHC.Conc.Sync

Methods

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

(<$) :: a -> STM b -> STM 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 #

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 #

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 #

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 #

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 #

Functor Down

Since: base-4.11.0.0

Instance details

Defined in Data.Ord

Methods

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

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

Functor ReadP

Since: base-2.1

Instance details

Defined in Text.ParserCombinators.ReadP

Methods

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

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

Functor NonEmpty

Since: base-4.9.0.0

Instance details

Defined in GHC.Base

Methods

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

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

Functor Put 
Instance details

Defined in Data.ByteString.Builder.Internal

Methods

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

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

Functor IntMap 
Instance details

Defined in Data.IntMap.Internal

Methods

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

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

Functor Tree 
Instance details

Defined in Data.Tree

Methods

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

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

Functor Seq 
Instance details

Defined in Data.Sequence.Internal

Methods

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

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

Functor FingerTree 
Instance details

Defined in Data.Sequence.Internal

Methods

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

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

Functor Digit 
Instance details

Defined in Data.Sequence.Internal

Methods

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

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

Functor Node 
Instance details

Defined in Data.Sequence.Internal

Methods

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

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

Functor Elem 
Instance details

Defined in Data.Sequence.Internal

Methods

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

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

Functor ViewL 
Instance details

Defined in Data.Sequence.Internal

Methods

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

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

Functor ViewR 
Instance details

Defined in Data.Sequence.Internal

Methods

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

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

Functor CryptoFailable 
Instance details

Defined in Crypto.Error.Types

Methods

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

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

Functor DList 
Instance details

Defined in Data.DList

Methods

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

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

Functor NonGreedy 
Instance details

Defined in Language.Haskell.Exts.Parser

Methods

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

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

Functor ListOf 
Instance details

Defined in Language.Haskell.Exts.Parser

Methods

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

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

Functor ModuleName 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

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

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

Functor SpecialCon 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

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

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

Functor QName 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

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

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

Functor Name 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

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

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

Functor IPName 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

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

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

Functor QOp 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

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

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

Functor Op 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

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

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

Functor CName 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

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

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

Functor Module 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

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

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

Functor ModuleHead 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

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

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

Functor ExportSpecList 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

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

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

Functor ExportSpec 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

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

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

Functor EWildcard 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

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

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

Functor Namespace 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

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

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

Functor ImportDecl 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

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

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

Functor ImportSpecList 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

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

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

Functor ImportSpec 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

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

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

Functor Assoc 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

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

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

Functor Decl 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

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

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

Functor PatternSynDirection 
Instance details

Defined in Language.Haskell.Exts.Syntax

Functor TypeEqn 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

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

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

Functor Annotation 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

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

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

Functor BooleanFormula 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

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

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

Functor Role 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

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

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

Functor DataOrNew 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

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

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

Functor InjectivityInfo 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

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

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

Functor ResultSig 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

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

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

Functor DeclHead 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

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

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

Functor InstRule 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

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

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

Functor InstHead 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

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

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

Functor Deriving 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

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

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

Functor DerivStrategy 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

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

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

Functor Binds 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

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

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

Functor IPBind 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

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

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

Functor Match 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

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

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

Functor QualConDecl 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

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

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

Functor ConDecl 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

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

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

Functor FieldDecl 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

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

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

Functor GadtDecl 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

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

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

Functor ClassDecl 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

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

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

Functor InstDecl 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

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

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

Functor BangType 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

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

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

Functor Unpackedness 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

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

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

Functor Rhs 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

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

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

Functor GuardedRhs 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

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

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

Functor Type 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

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

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

Functor MaybePromotedName 
Instance details

Defined in Language.Haskell.Exts.Syntax

Functor Promoted 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

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

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

Functor TyVarBind 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

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

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

Functor FunDep 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

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

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

Functor Context 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

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

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

Functor Asst 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

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

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

Functor Literal 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

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

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

Functor Sign 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

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

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

Functor Exp 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

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

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

Functor XName 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

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

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

Functor XAttr 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

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

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

Functor Bracket 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

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

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

Functor Splice 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

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

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

Functor Safety 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

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

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

Functor CallConv 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

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

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

Functor ModulePragma 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

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

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

Functor Overlap 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

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

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

Functor Activation 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

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

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

Functor Rule 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

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

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

Functor RuleVar 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

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

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

Functor WarningText 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

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

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

Functor Pat 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

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

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

Functor PXAttr 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

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

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

Functor RPatOp 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

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

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

Functor RPat 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

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

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

Functor PatField 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

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

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

Functor Stmt 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

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

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

Functor QualStmt 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

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

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

Functor FieldUpdate 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

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

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

Functor Alt 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

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

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

Functor Vector 
Instance details

Defined in Data.Vector

Methods

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

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

Functor ErrorItem 
Instance details

Defined in Text.Megaparsec.Error

Methods

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

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

Functor ErrorFancy 
Instance details

Defined in Text.Megaparsec.Error

Methods

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

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

Functor InstrAbstract 
Instance details

Defined in Michelson.Untyped.Instr

Methods

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

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

Functor Value' 
Instance details

Defined in Michelson.Untyped.Value

Methods

fmap :: (a -> b) -> Value' a -> Value' b #

(<$) :: a -> Value' b -> Value' a #

Functor Elt 
Instance details

Defined in Michelson.Untyped.Value

Methods

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

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

Functor Contract' 
Instance details

Defined in Michelson.Untyped.Contract

Methods

fmap :: (a -> b) -> Contract' a -> Contract' b #

(<$) :: a -> Contract' b -> Contract' a #

Functor ExtInstrAbstract 
Instance details

Defined in Michelson.Untyped.Ext

Methods

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

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

Functor TestAssert 
Instance details

Defined in Michelson.Untyped.Ext

Methods

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

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

Functor Doc 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Methods

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

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

Functor AnnotDetails 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Methods

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

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

Functor Span 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Methods

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

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

Functor SmallArray 
Instance details

Defined in Data.Primitive.SmallArray

Methods

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

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

Functor Array 
Instance details

Defined in Data.Primitive.Array

Methods

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

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

Functor Identity 
Instance details

Defined in Data.Vinyl.Functor

Methods

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

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

Functor Thunk 
Instance details

Defined in Data.Vinyl.Functor

Methods

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

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

Functor P

Since: base-4.8.0.0

Instance details

Defined in Text.ParserCombinators.ReadP

Methods

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

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

Functor IndigoM Source # 
Instance details

Defined in Indigo.Frontend.Program

Methods

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

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

Class () (Functor f) 
Instance details

Defined in Data.Constraint

Methods

cls :: Functor f :- () #

() :=> (Functor ((->) a :: Type -> Type)) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Functor ((->) a) #

() :=> (Functor []) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Functor [] #

() :=> (Functor Maybe) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Functor Maybe #

() :=> (Functor IO) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Functor IO #

() :=> (Functor (Either a)) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Functor (Either a) #

() :=> (Functor ((,) a)) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Functor ((,) a) #

() :=> (Functor Identity) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Functor Identity #

() :=> (Functor (Const a :: Type -> Type)) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Functor (Const a) #

Functor (Either a)

Since: base-3.0

Instance details

Defined in Data.Either

Methods

fmap :: (a0 -> b) -> Either a a0 -> Either a b #

(<$) :: a0 -> Either a b -> Either a a0 #

Functor (V1 :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

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

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

Functor (U1 :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

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

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

Functor ((,) a)

Since: base-2.1

Instance details

Defined in GHC.Base

Methods

fmap :: (a0 -> b) -> (a, a0) -> (a, b) #

(<$) :: a0 -> (a, b) -> (a, a0) #

Functor f => Functor (Co f) 
Instance details

Defined in Data.Functor.Rep

Methods

fmap :: (a -> b) -> Co f a -> Co f b #

(<$) :: a -> Co f b -> Co f a #

Functor (HashMap k) 
Instance details

Defined in Data.HashMap.Base

Methods

fmap :: (a -> b) -> HashMap k a -> HashMap k b #

(<$) :: a -> HashMap k b -> HashMap k a #

Functor (Map k) 
Instance details

Defined in Data.Map.Internal

Methods

fmap :: (a -> b) -> Map k a -> Map k b #

(<$) :: a -> Map k b -> Map k a #

Functor (IResult i) 
Instance details

Defined in Data.Attoparsec.Internal.Types

Methods

fmap :: (a -> b) -> IResult i a -> IResult i b #

(<$) :: a -> IResult i b -> IResult i a #

Functor (Parser i) 
Instance details

Defined in Data.Attoparsec.Internal.Types

Methods

fmap :: (a -> b) -> Parser i a -> Parser i b #

(<$) :: a -> Parser i b -> Parser i a #

Functor (Arg a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

fmap :: (a0 -> b) -> Arg a a0 -> Arg a b #

(<$) :: a0 -> Arg a b -> Arg a a0 #

Monad m => Functor (WrappedMonad m)

Since: base-2.1

Instance details

Defined in Control.Applicative

Methods

fmap :: (a -> b) -> WrappedMonad m a -> WrappedMonad m b #

(<$) :: a -> WrappedMonad m b -> WrappedMonad m a #

Arrow a => Functor (ArrowMonad a)

Since: base-4.6.0.0

Instance details

Defined in Control.Arrow

Methods

fmap :: (a0 -> b) -> ArrowMonad a a0 -> ArrowMonad a b #

(<$) :: a0 -> ArrowMonad a b -> ArrowMonad a a0 #

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 #

Functor m => Functor (MaybeT m) 
Instance details

Defined in Control.Monad.Trans.Maybe

Methods

fmap :: (a -> b) -> MaybeT m a -> MaybeT m b #

(<$) :: a -> MaybeT m b -> MaybeT m a #

Monad m => Functor (Handler m) 
Instance details

Defined in Control.Monad.Catch

Methods

fmap :: (a -> b) -> Handler m a -> Handler m b #

(<$) :: a -> Handler m b -> Handler m a #

Functor f => Functor (Cofree f) 
Instance details

Defined in Control.Comonad.Cofree

Methods

fmap :: (a -> b) -> Cofree f a -> Cofree f b #

(<$) :: a -> Cofree f b -> Cofree f a #

Functor f => Functor (Free f) 
Instance details

Defined in Control.Monad.Free

Methods

fmap :: (a -> b) -> Free f a -> Free f b #

(<$) :: a -> Free f b -> Free f a #

Functor (Yoneda f) 
Instance details

Defined in Data.Functor.Yoneda

Methods

fmap :: (a -> b) -> Yoneda f a -> Yoneda f b #

(<$) :: a -> Yoneda f b -> Yoneda f a #

Functor (ReifiedGetter s) 
Instance details

Defined in Control.Lens.Reified

Methods

fmap :: (a -> b) -> ReifiedGetter s a -> ReifiedGetter s b #

(<$) :: a -> ReifiedGetter s b -> ReifiedGetter s a #

Functor (ReifiedFold s) 
Instance details

Defined in Control.Lens.Reified

Methods

fmap :: (a -> b) -> ReifiedFold s a -> ReifiedFold s b #

(<$) :: a -> ReifiedFold s b -> ReifiedFold s a #

Functor f => Functor (Indexing f) 
Instance details

Defined in Control.Lens.Internal.Indexed

Methods

fmap :: (a -> b) -> Indexing f a -> Indexing f b #

(<$) :: a -> Indexing f b -> Indexing f a #

Functor f => Functor (Indexing64 f) 
Instance details

Defined in Control.Lens.Internal.Indexed

Methods

fmap :: (a -> b) -> Indexing64 f a -> Indexing64 f b #

(<$) :: a -> Indexing64 f b -> Indexing64 f a #

Functor (Annotation :: Type -> Type) 
Instance details

Defined in Michelson.Untyped.Annotation

Methods

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

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

Profunctor p => Functor (Prep p) 
Instance details

Defined in Data.Profunctor.Rep

Methods

fmap :: (a -> b) -> Prep p a -> Prep p b #

(<$) :: a -> Prep p b -> Prep p a #

Profunctor p => Functor (Coprep p) 
Instance details

Defined in Data.Profunctor.Rep

Methods

fmap :: (a -> b) -> Coprep p a -> Coprep p b #

(<$) :: a -> Coprep p b -> Coprep p a #

Functor (SomeIndigoState inp) Source # 
Instance details

Defined in Indigo.Internal.SIS

Methods

fmap :: (a -> b) -> SomeIndigoState inp a -> SomeIndigoState inp b #

(<$) :: a -> SomeIndigoState inp b -> SomeIndigoState inp a #

Functor (SomeGenCode inp) Source # 
Instance details

Defined in Indigo.Internal.SIS

Methods

fmap :: (a -> b) -> SomeGenCode inp a -> SomeGenCode inp b #

(<$) :: a -> SomeGenCode inp b -> SomeGenCode inp a #

Functor (Program instr) Source # 
Instance details

Defined in Indigo.Frontend.Program

Methods

fmap :: (a -> b) -> Program instr a -> Program instr b #

(<$) :: a -> Program instr b -> Program instr a #

Class (Functor f) (Applicative f) 
Instance details

Defined in Data.Constraint

Methods

cls :: Applicative f :- Functor f #

(Monad m) :=> (Functor (WrappedMonad m)) 
Instance details

Defined in Data.Constraint

Methods

ins :: Monad m :- Functor (WrappedMonad m) #

Functor f => Functor (Rec1 f)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

fmap :: (a -> b) -> Rec1 f a -> Rec1 f b #

(<$) :: a -> Rec1 f b -> Rec1 f a #

Functor (URec Char :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

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

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

Functor (URec Double :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

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

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

Functor (URec Float :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

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

(<$) :: a -> URec Float b -> URec Float 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 #

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 #

Functor (URec (Ptr ()) :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

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

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

Arrow a => Functor (WrappedArrow a b)

Since: base-2.1

Instance details

Defined in Control.Applicative

Methods

fmap :: (a0 -> b0) -> WrappedArrow a b a0 -> WrappedArrow a b b0 #

(<$) :: a0 -> WrappedArrow a b b0 -> WrappedArrow a b a0 #

Functor (Const m :: Type -> Type)

Since: base-2.1

Instance details

Defined in Data.Functor.Const

Methods

fmap :: (a -> b) -> Const m a -> Const m b #

(<$) :: a -> Const m b -> Const m 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 #

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 #

Bifunctor p => Functor (Join p) 
Instance details

Defined in Data.Bifunctor.Join

Methods

fmap :: (a -> b) -> Join p a -> Join p b #

(<$) :: a -> Join p b -> Join p a #

Bifunctor p => Functor (Fix p) 
Instance details

Defined in Data.Bifunctor.Fix

Methods

fmap :: (a -> b) -> Fix p a -> Fix p b #

(<$) :: a -> Fix p b -> Fix p a #

Functor m => Functor (IdentityT m) 
Instance details

Defined in Control.Monad.Trans.Identity

Methods

fmap :: (a -> b) -> IdentityT m a -> IdentityT m b #

(<$) :: a -> IdentityT m b -> IdentityT m a #

(Applicative f, Monad f) => Functor (WhenMissing f x)

Since: containers-0.5.9

Instance details

Defined in Data.IntMap.Internal

Methods

fmap :: (a -> b) -> WhenMissing f x a -> WhenMissing f x b #

(<$) :: a -> WhenMissing f x b -> WhenMissing f x a #

Functor m => Functor (ExceptT e m) 
Instance details

Defined in Control.Monad.Trans.Except

Methods

fmap :: (a -> b) -> ExceptT e m a -> ExceptT e m b #

(<$) :: a -> ExceptT e m b -> ExceptT e m a #

Functor f => Functor (FreeF f a) 
Instance details

Defined in Control.Monad.Trans.Free

Methods

fmap :: (a0 -> b) -> FreeF f a a0 -> FreeF f a b #

(<$) :: a0 -> FreeF f a b -> FreeF f a a0 #

(Functor f, Monad m) => Functor (FreeT f m) 
Instance details

Defined in Control.Monad.Trans.Free

Methods

fmap :: (a -> b) -> FreeT f m a -> FreeT f m b #

(<$) :: a -> FreeT f m b -> FreeT f m a #

Functor f => Functor (CofreeF f a) 
Instance details

Defined in Control.Comonad.Trans.Cofree

Methods

fmap :: (a0 -> b) -> CofreeF f a a0 -> CofreeF f a b #

(<$) :: a0 -> CofreeF f a b -> CofreeF f a a0 #

(Functor f, Functor w) => Functor (CofreeT f w) 
Instance details

Defined in Control.Comonad.Trans.Cofree

Methods

fmap :: (a -> b) -> CofreeT f w a -> CofreeT f w b #

(<$) :: a -> CofreeT f w b -> CofreeT f w a #

Functor (Day f g) 
Instance details

Defined in Data.Functor.Day

Methods

fmap :: (a -> b) -> Day f g a -> Day f g b #

(<$) :: a -> Day f g b -> Day f g a #

Functor m => Functor (ErrorT e m) 
Instance details

Defined in Control.Monad.Trans.Error

Methods

fmap :: (a -> b) -> ErrorT e m a -> ErrorT e m b #

(<$) :: a -> ErrorT e m b -> ErrorT e m a #

Functor m => Functor (StateT s m) 
Instance details

Defined in Control.Monad.Trans.State.Strict

Methods

fmap :: (a -> b) -> StateT s m a -> StateT s m b #

(<$) :: a -> StateT s m b -> StateT s m a #

Functor (ReifiedIndexedGetter i s) 
Instance details

Defined in Control.Lens.Reified

Methods

fmap :: (a -> b) -> ReifiedIndexedGetter i s a -> ReifiedIndexedGetter i s b #

(<$) :: a -> ReifiedIndexedGetter i s b -> ReifiedIndexedGetter i s a #

Functor (ReifiedIndexedFold i s) 
Instance details

Defined in Control.Lens.Reified

Methods

fmap :: (a -> b) -> ReifiedIndexedFold i s a -> ReifiedIndexedFold i s b #

(<$) :: a -> ReifiedIndexedFold i s b -> ReifiedIndexedFold i s a #

Functor (Indexed i a) 
Instance details

Defined in Control.Lens.Internal.Indexed

Methods

fmap :: (a0 -> b) -> Indexed i a a0 -> Indexed i a b #

(<$) :: a0 -> Indexed i a b -> Indexed i a a0 #

Functor m => Functor (ReaderT r m) 
Instance details

Defined in Control.Monad.Trans.Reader

Methods

fmap :: (a -> b) -> ReaderT r m a -> ReaderT r m b #

(<$) :: a -> ReaderT r m b -> ReaderT r m a #

Monad m => Functor (Focusing m s) 
Instance details

Defined in Lens.Micro.Mtl.Internal

Methods

fmap :: (a -> b) -> Focusing m s a -> Focusing m s b #

(<$) :: a -> Focusing m s b -> Focusing m s a #

Functor (k (May s)) => Functor (FocusingMay k s) 
Instance details

Defined in Lens.Micro.Mtl.Internal

Methods

fmap :: (a -> b) -> FocusingMay k s a -> FocusingMay k s b #

(<$) :: a -> FocusingMay k s b -> FocusingMay k s a #

Functor (Effect m r) 
Instance details

Defined in Lens.Micro.Mtl.Internal

Methods

fmap :: (a -> b) -> Effect m r a -> Effect m r b #

(<$) :: a -> Effect m r b -> Effect m r 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 #

Functor (Const a :: Type -> Type) 
Instance details

Defined in Data.Vinyl.Functor

Methods

fmap :: (a0 -> b) -> Const a a0 -> Const a b #

(<$) :: a0 -> Const a b -> Const a a0 #

Functor (Bazaar a b) 
Instance details

Defined in Lens.Micro

Methods

fmap :: (a0 -> b0) -> Bazaar a b a0 -> Bazaar a b b0 #

(<$) :: a0 -> Bazaar a b b0 -> Bazaar a b a0 #

Functor m => Functor (StateT s m) 
Instance details

Defined in Lens.Micro

Methods

fmap :: (a -> b) -> StateT s m a -> StateT s m b #

(<$) :: a -> StateT s m b -> StateT s m a #

Functor (GenCode inp out) Source # 
Instance details

Defined in Indigo.Internal.State

Methods

fmap :: (a -> b) -> GenCode inp out a -> GenCode inp out b #

(<$) :: a -> GenCode inp out b -> GenCode inp out a #

Functor (IndigoState inp out) Source # 
Instance details

Defined in Indigo.Internal.State

Methods

fmap :: (a -> b) -> IndigoState inp out a -> IndigoState inp out b #

(<$) :: a -> IndigoState inp out b -> IndigoState inp out a #

Functor ((->) r :: Type -> Type)

Since: base-2.1

Instance details

Defined in GHC.Base

Methods

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

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

Functor (K1 i c :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

fmap :: (a -> b) -> K1 i c a -> K1 i c b #

(<$) :: a -> K1 i c b -> K1 i c a #

(Functor f, Functor g) => Functor (f :+: g)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

fmap :: (a -> b) -> (f :+: g) a -> (f :+: g) b #

(<$) :: a -> (f :+: g) b -> (f :+: g) a #

(Functor f, Functor g) => Functor (f :*: g)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

fmap :: (a -> b) -> (f :*: g) a -> (f :*: g) b #

(<$) :: a -> (f :*: g) b -> (f :*: g) a #

(Functor f, Functor g) => Functor (Product f g)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Product

Methods

fmap :: (a -> b) -> Product f g a -> Product f g b #

(<$) :: a -> Product f g b -> Product f g a #

(Functor f, Functor g) => Functor (Sum f g)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Sum

Methods

fmap :: (a -> b) -> Sum f g a -> Sum f g b #

(<$) :: a -> Sum f g b -> Sum f g a #

Functor f => Functor (WhenMatched f x y)

Since: containers-0.5.9

Instance details

Defined in Data.IntMap.Internal

Methods

fmap :: (a -> b) -> WhenMatched f x y a -> WhenMatched f x y b #

(<$) :: a -> WhenMatched f x y b -> WhenMatched f x y a #

(Applicative f, Monad f) => Functor (WhenMissing f k x)

Since: containers-0.5.9

Instance details

Defined in Data.Map.Internal

Methods

fmap :: (a -> b) -> WhenMissing f k x a -> WhenMissing f k x b #

(<$) :: a -> WhenMissing f k x b -> WhenMissing f k x a #

Monad m => Functor (FocusingWith w m s) 
Instance details

Defined in Lens.Micro.Mtl.Internal

Methods

fmap :: (a -> b) -> FocusingWith w m s a -> FocusingWith w m s b #

(<$) :: a -> FocusingWith w m s b -> FocusingWith w m s a #

Functor (k (s, w)) => Functor (FocusingPlus w k s) 
Instance details

Defined in Lens.Micro.Mtl.Internal

Methods

fmap :: (a -> b) -> FocusingPlus w k s a -> FocusingPlus w k s b #

(<$) :: a -> FocusingPlus w k s b -> FocusingPlus w k s a #

Functor (k (f s)) => Functor (FocusingOn f k s) 
Instance details

Defined in Lens.Micro.Mtl.Internal

Methods

fmap :: (a -> b) -> FocusingOn f k s a -> FocusingOn f k s b #

(<$) :: a -> FocusingOn f k s b -> FocusingOn f k s a #

Functor (k (Err e s)) => Functor (FocusingErr e k s) 
Instance details

Defined in Lens.Micro.Mtl.Internal

Methods

fmap :: (a -> b) -> FocusingErr e k s a -> FocusingErr e k s b #

(<$) :: a -> FocusingErr e k s b -> FocusingErr e k s a #

Profunctor p => Functor (Procompose p q a) 
Instance details

Defined in Data.Profunctor.Composition

Methods

fmap :: (a0 -> b) -> Procompose p q a a0 -> Procompose p q a b #

(<$) :: a0 -> Procompose p q a b -> Procompose p q a a0 #

Profunctor p => Functor (Rift p q a) 
Instance details

Defined in Data.Profunctor.Composition

Methods

fmap :: (a0 -> b) -> Rift p q a a0 -> Rift p q a b #

(<$) :: a0 -> Rift p q a b -> Rift p q a a0 #

Functor f => Functor (M1 i c f)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

fmap :: (a -> b) -> M1 i c f a -> M1 i c f b #

(<$) :: a -> M1 i c f b -> M1 i c f a #

(Functor f, Functor g) => Functor (f :.: g)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

fmap :: (a -> b) -> (f :.: g) a -> (f :.: g) b #

(<$) :: a -> (f :.: g) b -> (f :.: g) a #

(Functor f, Functor g) => Functor (Compose f g)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Compose

Methods

fmap :: (a -> b) -> Compose f g a -> Compose f g b #

(<$) :: a -> Compose f g b -> Compose f g a #

Bifunctor p => Functor (WrappedBifunctor p a) 
Instance details

Defined in Data.Bifunctor.Wrapped

Methods

fmap :: (a0 -> b) -> WrappedBifunctor p a a0 -> WrappedBifunctor p a b #

(<$) :: a0 -> WrappedBifunctor p a b -> WrappedBifunctor p a a0 #

Functor g => Functor (Joker g a) 
Instance details

Defined in Data.Bifunctor.Joker

Methods

fmap :: (a0 -> b) -> Joker g a a0 -> Joker g a b #

(<$) :: a0 -> Joker g a b -> Joker g a a0 #

Bifunctor p => Functor (Flip p a) 
Instance details

Defined in Data.Bifunctor.Flip

Methods

fmap :: (a0 -> b) -> Flip p a a0 -> Flip p a b #

(<$) :: a0 -> Flip p a b -> Flip p a a0 #

Functor (Clown f a :: Type -> Type) 
Instance details

Defined in Data.Bifunctor.Clown

Methods

fmap :: (a0 -> b) -> Clown f a a0 -> Clown f a b #

(<$) :: a0 -> Clown f a b -> Clown f a a0 #

Functor f => Functor (WhenMatched f k x y)

Since: containers-0.5.9

Instance details

Defined in Data.Map.Internal

Methods

fmap :: (a -> b) -> WhenMatched f k x y a -> WhenMatched f k x y b #

(<$) :: a -> WhenMatched f k x y b -> WhenMatched f k x y a #

Functor (EffectRWS w st m s) 
Instance details

Defined in Lens.Micro.Mtl.Internal

Methods

fmap :: (a -> b) -> EffectRWS w st m s a -> EffectRWS w st m s b #

(<$) :: a -> EffectRWS w st m s b -> EffectRWS w st m s a #

Reifies s (ReifiedApplicative f) => Functor (ReflectedApplicative f s) 
Instance details

Defined in Data.Reflection

Methods

fmap :: (a -> b) -> ReflectedApplicative f s a -> ReflectedApplicative f s b #

(<$) :: a -> ReflectedApplicative f s b -> ReflectedApplicative f s a #

(Functor f, Functor g) => Functor (Compose f g) 
Instance details

Defined in Data.Vinyl.Functor

Methods

fmap :: (a -> b) -> Compose f g a -> Compose f g b #

(<$) :: a -> Compose f g b -> Compose f g a #

Monad state => Functor (Builder collection mutCollection step state err) 
Instance details

Defined in Basement.MutableBuilder

Methods

fmap :: (a -> b) -> Builder collection mutCollection step state err a -> Builder collection mutCollection step state err b #

(<$) :: a -> Builder collection mutCollection step state err b -> Builder collection mutCollection step state err a #

(Functor f, Bifunctor p) => Functor (Tannen f p a) 
Instance details

Defined in Data.Bifunctor.Tannen

Methods

fmap :: (a0 -> b) -> Tannen f p a a0 -> Tannen f p a b #

(<$) :: a0 -> Tannen f p a b -> Tannen f p a a0 #

(Functor f, Functor g) => Functor (Lift Either f g) 
Instance details

Defined in Data.Vinyl.Functor

Methods

fmap :: (a -> b) -> Lift Either f g a -> Lift Either f g b #

(<$) :: a -> Lift Either f g b -> Lift Either f g a #

(Functor f, Functor g) => Functor (Lift (,) f g) 
Instance details

Defined in Data.Vinyl.Functor

Methods

fmap :: (a -> b) -> Lift (,) f g a -> Lift (,) f g b #

(<$) :: a -> Lift (,) f g b -> Lift (,) f g a #

(Bifunctor p, Functor g) => Functor (Biff p f g a) 
Instance details

Defined in Data.Bifunctor.Biff

Methods

fmap :: (a0 -> b) -> Biff p f g a a0 -> Biff p f g a b #

(<$) :: a0 -> Biff p f g a b -> Biff p f g a a0 #

class Num a where #

Basic numeric class.

The Haskell Report defines no laws for Num. However, (+) and (*) are customarily expected to define a ring and have the following properties:

Associativity of (+)
(x + y) + z = x + (y + z)
Commutativity of (+)
x + y = y + x
fromInteger 0 is the additive identity
x + fromInteger 0 = x
negate gives the additive inverse
x + negate x = fromInteger 0
Associativity of (*)
(x * y) * z = x * (y * z)
fromInteger 1 is the multiplicative identity
x * fromInteger 1 = x and fromInteger 1 * x = x
Distributivity of (*) with respect to (+)
a * (b + c) = (a * b) + (a * c) and (b + c) * a = (b * a) + (c * a)

Note that it isn't customarily expected that a type instance of both Num and Ord implement an ordered ring. Indeed, in base only Integer and Rational do.

Minimal complete definition

(+), (*), abs, signum, fromInteger, (negate | (-))

Methods

negate :: a -> a #

Unary negation.

signum :: a -> a #

Sign of a number. The functions abs and signum should satisfy the law:

abs x * signum x == x

For real numbers, the signum is either -1 (negative), 0 (zero) or 1 (positive).

Instances

Instances details
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 #

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 #

Num Int16

Since: base-2.1

Instance details

Defined in GHC.Int

Num Int32

Since: base-2.1

Instance details

Defined in GHC.Int

Num Int64

Since: base-2.1

Instance details

Defined in GHC.Int

Num Integer

Since: base-2.1

Instance details

Defined in GHC.Num

Num Natural

Note that Natural's Num instance isn't a ring: no element but 0 has an additive inverse. It is a semiring though.

Since: base-4.8.0.0

Instance details

Defined in GHC.Num

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 #

Num Word8

Since: base-2.1

Instance details

Defined in GHC.Word

Num Word16

Since: base-2.1

Instance details

Defined in GHC.Word

Num Word32

Since: base-2.1

Instance details

Defined in GHC.Word

Num Word64

Since: base-2.1

Instance details

Defined in GHC.Word

Num Scientific

WARNING: + and - compute the Integer magnitude: 10^e where e is the difference between the base10Exponents of the arguments. If these methods are applied to arguments which have huge exponents this could fill up all space and crash your program! So don't apply these methods to scientific numbers coming from untrusted sources. The other methods can be used safely.

Instance details

Defined in Data.Scientific

Num Pos 
Instance details

Defined in Data.Attoparsec.Internal.Types

Methods

(+) :: Pos -> Pos -> Pos #

(-) :: Pos -> Pos -> Pos #

(*) :: Pos -> Pos -> Pos #

negate :: Pos -> Pos #

abs :: Pos -> Pos #

signum :: Pos -> Pos #

fromInteger :: Integer -> Pos #

Num RemainingSteps 
Instance details

Defined in Michelson.Interpret

Num CodePoint 
Instance details

Defined in Data.Text.Encoding

Methods

(+) :: CodePoint -> CodePoint -> CodePoint #

(-) :: CodePoint -> CodePoint -> CodePoint #

(*) :: CodePoint -> CodePoint -> CodePoint #

negate :: CodePoint -> CodePoint #

abs :: CodePoint -> CodePoint #

signum :: CodePoint -> CodePoint #

fromInteger :: Integer -> CodePoint #

Num DecoderState 
Instance details

Defined in Data.Text.Encoding

Methods

(+) :: DecoderState -> DecoderState -> DecoderState #

(-) :: DecoderState -> DecoderState -> DecoderState #

(*) :: DecoderState -> DecoderState -> DecoderState #

negate :: DecoderState -> DecoderState #

abs :: DecoderState -> DecoderState #

signum :: DecoderState -> DecoderState #

fromInteger :: Integer -> DecoderState #

Num RefId Source # 
Instance details

Defined in Indigo.Internal.State

Class () (Num a) 
Instance details

Defined in Data.Constraint

Methods

cls :: Num a :- () #

() :=> (Num Double) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Num Double #

() :=> (Num Float) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Num Float #

() :=> (Num Int) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Num Int #

() :=> (Num Integer) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Num Integer #

() :=> (Num Natural) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Num Natural #

() :=> (Num Word) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Num Word #

Integral a => Num (Ratio a)

Since: base-2.0.1

Instance details

Defined in GHC.Real

Methods

(+) :: Ratio a -> Ratio a -> Ratio a #

(-) :: Ratio a -> Ratio a -> Ratio a #

(*) :: Ratio a -> Ratio a -> Ratio a #

negate :: Ratio a -> Ratio a #

abs :: Ratio a -> Ratio a #

signum :: Ratio a -> Ratio a #

fromInteger :: Integer -> Ratio a #

RealFloat a => Num (Complex a)

Since: base-2.1

Instance details

Defined in Data.Complex

Methods

(+) :: Complex a -> Complex a -> Complex a #

(-) :: Complex a -> Complex a -> Complex a #

(*) :: Complex a -> Complex a -> Complex a #

negate :: Complex a -> Complex a #

abs :: Complex a -> Complex a #

signum :: Complex a -> Complex a #

fromInteger :: Integer -> Complex a #

Num a => Num (Min a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

(+) :: Min a -> Min a -> Min a #

(-) :: Min a -> Min a -> Min a #

(*) :: Min a -> Min a -> Min a #

negate :: Min a -> Min a #

abs :: Min a -> Min a #

signum :: Min a -> Min a #

fromInteger :: Integer -> Min a #

Num a => Num (Max a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

(+) :: Max a -> Max a -> Max a #

(-) :: Max a -> Max a -> Max a #

(*) :: Max a -> Max a -> Max a #

negate :: Max a -> Max a #

abs :: Max a -> Max a #

signum :: Max a -> Max a #

fromInteger :: Integer -> Max a #

Num a => Num (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

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 #

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 #

Num a => Num (Down a)

Since: base-4.11.0.0

Instance details

Defined in Data.Ord

Methods

(+) :: Down a -> Down a -> Down a #

(-) :: Down a -> Down a -> Down a #

(*) :: Down a -> Down a -> Down a #

negate :: Down a -> Down a #

abs :: Down a -> Down a #

signum :: Down a -> Down a #

fromInteger :: Integer -> Down a #

Num (Offset ty) 
Instance details

Defined in Basement.Types.OffsetSize

Methods

(+) :: Offset ty -> Offset ty -> Offset ty #

(-) :: Offset ty -> Offset ty -> Offset ty #

(*) :: Offset ty -> Offset ty -> Offset ty #

negate :: Offset ty -> Offset ty #

abs :: Offset ty -> Offset ty #

signum :: Offset ty -> Offset ty #

fromInteger :: Integer -> Offset ty #

Num (CountOf ty) 
Instance details

Defined in Basement.Types.OffsetSize

Methods

(+) :: CountOf ty -> CountOf ty -> CountOf ty #

(-) :: CountOf ty -> CountOf ty -> CountOf ty #

(*) :: CountOf ty -> CountOf ty -> CountOf ty #

negate :: CountOf ty -> CountOf ty #

abs :: CountOf ty -> CountOf ty #

signum :: CountOf ty -> CountOf ty #

fromInteger :: Integer -> CountOf ty #

(KnownNat n, NatWithinBound Word64 n) => Num (Zn64 n) 
Instance details

Defined in Basement.Bounded

Methods

(+) :: Zn64 n -> Zn64 n -> Zn64 n #

(-) :: Zn64 n -> Zn64 n -> Zn64 n #

(*) :: Zn64 n -> Zn64 n -> Zn64 n #

negate :: Zn64 n -> Zn64 n #

abs :: Zn64 n -> Zn64 n #

signum :: Zn64 n -> Zn64 n #

fromInteger :: Integer -> Zn64 n #

KnownNat n => Num (Zn n) 
Instance details

Defined in Basement.Bounded

Methods

(+) :: Zn n -> Zn n -> Zn n #

(-) :: Zn n -> Zn n -> Zn n #

(*) :: Zn n -> Zn n -> Zn n #

negate :: Zn n -> Zn n #

abs :: Zn n -> Zn n #

signum :: Zn n -> Zn n #

fromInteger :: Integer -> Zn n #

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

Defined in Data.Vinyl.Functor

Methods

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

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

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

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

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

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

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

Class (Num a) (Fractional a) 
Instance details

Defined in Data.Constraint

Methods

cls :: Fractional a :- Num a #

(Integral a) :=> (Num (Ratio a)) 
Instance details

Defined in Data.Constraint

Methods

ins :: Integral a :- Num (Ratio a) #

(Num a) :=> (Num (Identity a)) 
Instance details

Defined in Data.Constraint

Methods

ins :: Num a :- Num (Identity a) #

(Num a) :=> (Num (Const a b)) 
Instance details

Defined in Data.Constraint

Methods

ins :: Num a :- Num (Const a b) #

(RealFloat a) :=> (Num (Complex a)) 
Instance details

Defined in Data.Constraint

Methods

ins :: RealFloat a :- Num (Complex a) #

Class (Num a, Ord a) (Real a) 
Instance details

Defined in Data.Constraint

Methods

cls :: Real a :- (Num a, Ord a) #

Num a => Num (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 #

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

negate :: Const a b -> Const a b #

abs :: Const a b -> Const a b #

signum :: Const a b -> Const a b #

fromInteger :: Integer -> Const a b #

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

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 #

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 #

class Eq a => Ord a where #

The Ord class is used for totally ordered datatypes.

Instances of Ord can be derived for any user-defined datatype whose constituent types are in Ord. The declared order of the constructors in the data declaration determines the ordering in derived Ord instances. The Ordering datatype allows a single comparison to determine the precise ordering of two objects.

The Haskell Report defines no laws for Ord. However, <= is customarily expected to implement a non-strict partial order and have the following properties:

Transitivity
if x <= y && y <= z = True, then x <= z = True
Reflexivity
x <= x = True
Antisymmetry
if x <= y && y <= x = True, then x == y = True

Note that the following operator interactions are expected to hold:

  1. x >= y = y <= x
  2. x < y = x <= y && x /= y
  3. x > y = y < x
  4. x < y = compare x y == LT
  5. x > y = compare x y == GT
  6. x == y = compare x y == EQ
  7. min x y == if x <= y then x else y = True
  8. max x y == if x >= y then x else y = True

Minimal complete definition: either compare or <=. Using compare can be more efficient for complex types.

Minimal complete definition

compare | (<=)

Methods

compare :: a -> a -> Ordering #

max :: a -> a -> a #

min :: a -> a -> a #

Instances

Instances details
Ord Bool 
Instance details

Defined in GHC.Classes

Methods

compare :: Bool -> Bool -> Ordering #

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

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

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

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

max :: Bool -> Bool -> Bool #

min :: Bool -> Bool -> Bool #

Ord Char 
Instance details

Defined in GHC.Classes

Methods

compare :: Char -> Char -> Ordering #

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

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

(>) :: Char -> Char -> Bool #

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

max :: Char -> Char -> Char #

min :: Char -> Char -> Char #

Ord Double

Note that due to the presence of NaN, Double's Ord instance does not satisfy reflexivity.

>>> 0/0 <= (0/0 :: Double)
False

Also note that, due to the same, Ord's operator interactions are not respected by Double's instance:

>>> (0/0 :: Double) > 1
False
>>> compare (0/0 :: Double) 1
GT
Instance details

Defined in GHC.Classes

Ord Float

Note that due to the presence of NaN, Float's Ord instance does not satisfy reflexivity.

>>> 0/0 <= (0/0 :: Float)
False

Also note that, due to the same, Ord's operator interactions are not respected by Float's instance:

>>> (0/0 :: Float) > 1
False
>>> compare (0/0 :: Float) 1
GT
Instance details

Defined in GHC.Classes

Methods

compare :: Float -> Float -> Ordering #

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

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

(>) :: Float -> Float -> Bool #

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

max :: Float -> Float -> Float #

min :: Float -> Float -> Float #

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 #

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 #

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 #

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 #

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 #

Ord Integer 
Instance details

Defined in GHC.Integer.Type

Ord Natural

Since: base-4.8.0.0

Instance details

Defined in GHC.Natural

Ord Ordering 
Instance details

Defined in GHC.Classes

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 #

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 #

Ord Word16

Since: base-2.1

Instance details

Defined in GHC.Word

Ord Word32

Since: base-2.1

Instance details

Defined in GHC.Word

Ord Word64

Since: base-2.1

Instance details

Defined in GHC.Word

Ord SomeTypeRep 
Instance details

Defined in Data.Typeable.Internal

Ord Exp 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: Exp -> Exp -> Ordering #

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

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

(>) :: Exp -> Exp -> Bool #

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

max :: Exp -> Exp -> Exp #

min :: Exp -> Exp -> Exp #

Ord Match 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: Match -> Match -> Ordering #

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

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

(>) :: Match -> Match -> Bool #

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

max :: Match -> Match -> Match #

min :: Match -> Match -> Match #

Ord Clause 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord Pat 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: Pat -> Pat -> Ordering #

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

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

(>) :: Pat -> Pat -> Bool #

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

max :: Pat -> Pat -> Pat #

min :: Pat -> Pat -> Pat #

Ord Type 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: Type -> Type -> Ordering #

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

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

(>) :: Type -> Type -> Bool #

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

max :: Type -> Type -> Type #

min :: Type -> Type -> Type #

Ord Dec 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: Dec -> Dec -> Ordering #

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

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

(>) :: Dec -> Dec -> Bool #

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

max :: Dec -> Dec -> Dec #

min :: Dec -> Dec -> Dec #

Ord Name 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: Name -> Name -> Ordering #

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

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

(>) :: Name -> Name -> Bool #

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

max :: Name -> Name -> Name #

min :: Name -> Name -> Name #

Ord FunDep 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord InjectivityAnn 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord Overlap 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord () 
Instance details

Defined in GHC.Classes

Methods

compare :: () -> () -> Ordering #

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

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

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

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

max :: () -> () -> () #

min :: () -> () -> () #

Ord TyCon 
Instance details

Defined in GHC.Classes

Methods

compare :: TyCon -> TyCon -> Ordering #

(<) :: TyCon -> TyCon -> Bool #

(<=) :: TyCon -> TyCon -> Bool #

(>) :: TyCon -> TyCon -> Bool #

(>=) :: TyCon -> TyCon -> Bool #

max :: TyCon -> TyCon -> TyCon #

min :: TyCon -> TyCon -> TyCon #

Ord Version

Since: base-2.1

Instance details

Defined in Data.Version

Ord Con 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: Con -> Con -> Ordering #

(<) :: Con -> Con -> Bool #

(<=) :: Con -> Con -> Bool #

(>) :: Con -> Con -> Bool #

(>=) :: Con -> Con -> Bool #

max :: Con -> Con -> Con #

min :: Con -> Con -> Con #

Ord ByteString 
Instance details

Defined in Data.ByteString.Internal

Ord ByteString 
Instance details

Defined in Data.ByteString.Lazy.Internal

Ord Scientific

Scientific numbers can be safely compared for ordering. No magnitude 10^e is calculated so there's no risk of a blowup in space or time when comparing scientific numbers coming from untrusted sources.

Instance details

Defined in Data.Scientific

Ord UTCTime 
Instance details

Defined in Data.Time.Clock.Internal.UTCTime

Ord JSONPathElement 
Instance details

Defined in Data.Aeson.Types.Internal

Ord DotNetTime 
Instance details

Defined in Data.Aeson.Types.Internal

Ord Pos 
Instance details

Defined in Data.Attoparsec.Internal.Types

Methods

compare :: Pos -> Pos -> Ordering #

(<) :: Pos -> Pos -> Bool #

(<=) :: Pos -> Pos -> Bool #

(>) :: Pos -> Pos -> Bool #

(>=) :: Pos -> Pos -> Bool #

max :: Pos -> Pos -> Pos #

min :: Pos -> Pos -> Pos #

Ord BigNat 
Instance details

Defined in GHC.Integer.Type

Ord Void

Since: base-4.8.0.0

Instance details

Defined in Data.Void

Methods

compare :: Void -> Void -> Ordering #

(<) :: Void -> Void -> Bool #

(<=) :: Void -> Void -> Bool #

(>) :: Void -> Void -> Bool #

(>=) :: Void -> Void -> Bool #

max :: Void -> Void -> Void #

min :: Void -> Void -> Void #

Ord ThreadId

Since: base-4.2.0.0

Instance details

Defined in GHC.Conc.Sync

Ord BlockReason

Since: base-4.3.0.0

Instance details

Defined in GHC.Conc.Sync

Ord ThreadStatus

Since: base-4.3.0.0

Instance details

Defined in GHC.Conc.Sync

Ord AsyncException

Since: base-4.2.0.0

Instance details

Defined in GHC.IO.Exception

Ord ArrayException

Since: base-4.2.0.0

Instance details

Defined in GHC.IO.Exception

Ord ExitCode 
Instance details

Defined in GHC.IO.Exception

Ord BufferMode

Since: base-4.2.0.0

Instance details

Defined in GHC.IO.Handle.Types

Ord Newline

Since: base-4.3.0.0

Instance details

Defined in GHC.IO.Handle.Types

Ord NewlineMode

Since: base-4.3.0.0

Instance details

Defined in GHC.IO.Handle.Types

Ord ErrorCall

Since: base-4.7.0.0

Instance details

Defined in GHC.Exception

Ord ArithException

Since: base-3.0

Instance details

Defined in GHC.Exception.Type

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 #

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 #

Ord Fixity

Since: base-4.6.0.0

Instance details

Defined in GHC.Generics

Ord Associativity

Since: base-4.6.0.0

Instance details

Defined in GHC.Generics

Ord SourceUnpackedness

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Ord SourceStrictness

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Ord DecidedStrictness

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Ord SomeSymbol

Since: base-4.7.0.0

Instance details

Defined in GHC.TypeLits

Ord SomeNat

Since: base-4.7.0.0

Instance details

Defined in GHC.TypeNats

Ord IOMode

Since: base-4.2.0.0

Instance details

Defined in GHC.IO.IOMode

Ord Alphabet 
Instance details

Defined in Data.ByteString.Base58.Internal

Ord UTF32_Invalid 
Instance details

Defined in Basement.String.Encoding.UTF32

Methods

compare :: UTF32_Invalid -> UTF32_Invalid -> Ordering #

(<) :: UTF32_Invalid -> UTF32_Invalid -> Bool #

(<=) :: UTF32_Invalid -> UTF32_Invalid -> Bool #

(>) :: UTF32_Invalid -> UTF32_Invalid -> Bool #

(>=) :: UTF32_Invalid -> UTF32_Invalid -> Bool #

max :: UTF32_Invalid -> UTF32_Invalid -> UTF32_Invalid #

min :: UTF32_Invalid -> UTF32_Invalid -> UTF32_Invalid #

Ord Encoding 
Instance details

Defined in Basement.String

Ord String 
Instance details

Defined in Basement.UTF8.Base

Ord FileSize 
Instance details

Defined in Basement.Types.OffsetSize

Ord IntSet 
Instance details

Defined in Data.IntSet.Internal

Ord Boxed 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: Boxed -> Boxed -> Ordering #

(<) :: Boxed -> Boxed -> Bool #

(<=) :: Boxed -> Boxed -> Bool #

(>) :: Boxed -> Boxed -> Bool #

(>=) :: Boxed -> Boxed -> Bool #

max :: Boxed -> Boxed -> Boxed #

min :: Boxed -> Boxed -> Boxed #

Ord Tool 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: Tool -> Tool -> Ordering #

(<) :: Tool -> Tool -> Bool #

(<=) :: Tool -> Tool -> Bool #

(>) :: Tool -> Tool -> Bool #

(>=) :: Tool -> Tool -> Bool #

max :: Tool -> Tool -> Tool #

min :: Tool -> Tool -> Tool #

Ord SrcLoc 
Instance details

Defined in Language.Haskell.Exts.SrcLoc

Ord SrcSpan 
Instance details

Defined in Language.Haskell.Exts.SrcLoc

Ord SrcSpanInfo 
Instance details

Defined in Language.Haskell.Exts.SrcLoc

Ord AnnLookup 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord Role 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: Role -> Role -> Ordering #

(<) :: Role -> Role -> Bool #

(<=) :: Role -> Role -> Bool #

(>) :: Role -> Role -> Bool #

(>=) :: Role -> Role -> Bool #

max :: Role -> Role -> Role #

min :: Role -> Role -> Role #

Ord TyLit 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: TyLit -> TyLit -> Ordering #

(<) :: TyLit -> TyLit -> Bool #

(<=) :: TyLit -> TyLit -> Bool #

(>) :: TyLit -> TyLit -> Bool #

(>=) :: TyLit -> TyLit -> Bool #

max :: TyLit -> TyLit -> TyLit #

min :: TyLit -> TyLit -> TyLit #

Ord FamilyResultSig 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord TyVarBndr 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord PatSynArgs 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord PatSynDir 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord Bang 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: Bang -> Bang -> Ordering #

(<) :: Bang -> Bang -> Bool #

(<=) :: Bang -> Bang -> Bool #

(>) :: Bang -> Bang -> Bool #

(>=) :: Bang -> Bang -> Bool #

max :: Bang -> Bang -> Bang #

min :: Bang -> Bang -> Bang #

Ord DecidedStrictness 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord SourceStrictness 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord SourceUnpackedness 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord AnnTarget 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord RuleBndr 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord Phases 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord RuleMatch 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord Inline 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord Pragma 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord Safety 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord Callconv 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord Foreign 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord TySynEqn 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord TypeFamilyHead 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord DerivStrategy 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord DerivClause 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord Range 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: Range -> Range -> Ordering #

(<) :: Range -> Range -> Bool #

(<=) :: Range -> Range -> Bool #

(>) :: Range -> Range -> Bool #

(>=) :: Range -> Range -> Bool #

max :: Range -> Range -> Range #

min :: Range -> Range -> Range #

Ord Stmt 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: Stmt -> Stmt -> Ordering #

(<) :: Stmt -> Stmt -> Bool #

(<=) :: Stmt -> Stmt -> Bool #

(>) :: Stmt -> Stmt -> Bool #

(>=) :: Stmt -> Stmt -> Bool #

max :: Stmt -> Stmt -> Stmt #

min :: Stmt -> Stmt -> Stmt #

Ord Guard 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: Guard -> Guard -> Ordering #

(<) :: Guard -> Guard -> Bool #

(<=) :: Guard -> Guard -> Bool #

(>) :: Guard -> Guard -> Bool #

(>=) :: Guard -> Guard -> Bool #

max :: Guard -> Guard -> Guard #

min :: Guard -> Guard -> Guard #

Ord Body 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: Body -> Body -> Ordering #

(<) :: Body -> Body -> Bool #

(<=) :: Body -> Body -> Bool #

(>) :: Body -> Body -> Bool #

(>=) :: Body -> Body -> Bool #

max :: Body -> Body -> Body #

min :: Body -> Body -> Body #

Ord Lit 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: Lit -> Lit -> Ordering #

(<) :: Lit -> Lit -> Bool #

(<=) :: Lit -> Lit -> Bool #

(>) :: Lit -> Lit -> Bool #

(>=) :: Lit -> Lit -> Bool #

max :: Lit -> Lit -> Lit #

min :: Lit -> Lit -> Lit #

Ord FixityDirection 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord Fixity 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord ModuleInfo 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord Info 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: Info -> Info -> Ordering #

(<) :: Info -> Info -> Bool #

(<=) :: Info -> Info -> Bool #

(>) :: Info -> Info -> Bool #

(>=) :: Info -> Info -> Bool #

max :: Info -> Info -> Info #

min :: Info -> Info -> Info #

Ord Loc 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: Loc -> Loc -> Ordering #

(<) :: Loc -> Loc -> Bool #

(<=) :: Loc -> Loc -> Bool #

(>) :: Loc -> Loc -> Bool #

(>=) :: Loc -> Loc -> Bool #

max :: Loc -> Loc -> Loc #

min :: Loc -> Loc -> Loc #

Ord NameSpace 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord DDescribeErrorTagMap 
Instance details

Defined in Lorentz.Errors.Numeric.Doc

Ord DUStoreTemplate 
Instance details

Defined in Lorentz.UStore.Doc

Ord DError 
Instance details

Defined in Lorentz.Errors

Ord EpName 
Instance details

Defined in Michelson.Untyped.EntryPoints

Ord MText 
Instance details

Defined in Michelson.Text

Methods

compare :: MText -> MText -> Ordering #

(<) :: MText -> MText -> Bool #

(<=) :: MText -> MText -> Bool #

(>) :: MText -> MText -> Bool #

(>=) :: MText -> MText -> Bool #

max :: MText -> MText -> MText #

min :: MText -> MText -> MText #

Ord KeyHash 
Instance details

Defined in Tezos.Crypto

Ord Timestamp 
Instance details

Defined in Tezos.Core

Ord Mutez 
Instance details

Defined in Tezos.Core

Methods

compare :: Mutez -> Mutez -> Ordering #

(<) :: Mutez -> Mutez -> Bool #

(<=) :: Mutez -> Mutez -> Bool #

(>) :: Mutez -> Mutez -> Bool #

(>=) :: Mutez -> Mutez -> Bool #

max :: Mutez -> Mutez -> Mutez #

min :: Mutez -> Mutez -> Mutez #

Ord Address 
Instance details

Defined in Tezos.Address

Ord EpAddress 
Instance details

Defined in Michelson.Typed.EntryPoints

Ord SomeDocDefinitionItem 
Instance details

Defined in Michelson.Doc

Ord DocItemId 
Instance details

Defined in Michelson.Doc

Ord DType 
Instance details

Defined in Michelson.Typed.Haskell.Doc

Methods

compare :: DType -> DType -> Ordering #

(<) :: DType -> DType -> Bool #

(<=) :: DType -> DType -> Bool #

(>) :: DType -> DType -> Bool #

(>=) :: DType -> DType -> Bool #

max :: DType -> DType -> DType #

min :: DType -> DType -> DType #

Ord Pos 
Instance details

Defined in Text.Megaparsec.Pos

Methods

compare :: Pos -> Pos -> Ordering #

(<) :: Pos -> Pos -> Bool #

(<=) :: Pos -> Pos -> Bool #

(>) :: Pos -> Pos -> Bool #

(>=) :: Pos -> Pos -> Bool #

max :: Pos -> Pos -> Pos #

min :: Pos -> Pos -> Pos #

Ord SourcePos 
Instance details

Defined in Text.Megaparsec.Pos

Ord DocItemPos 
Instance details

Defined in Michelson.Doc

Methods

compare :: DocItemPos -> DocItemPos -> Ordering #

(<) :: DocItemPos -> DocItemPos -> Bool #

(<=) :: DocItemPos -> DocItemPos -> Bool #

(>) :: DocItemPos -> DocItemPos -> Bool #

(>=) :: DocItemPos -> DocItemPos -> Bool #

max :: DocItemPos -> DocItemPos -> DocItemPos #

min :: DocItemPos -> DocItemPos -> DocItemPos #

Ord RemainingSteps 
Instance details

Defined in Michelson.Interpret

Ord ArithErrorType 
Instance details

Defined in Michelson.Typed.Arith

Ord ContractHash 
Instance details

Defined in Tezos.Address

Ord OperationHash 
Instance details

Defined in Tezos.Address

Ord OriginationIndex 
Instance details

Defined in Tezos.Address

Ord KeyHashTag 
Instance details

Defined in Tezos.Crypto

Ord CustomParserException 
Instance details

Defined in Michelson.Parser.Error

Ord StringLiteralParserException 
Instance details

Defined in Michelson.Parser.Error

Ord Positive 
Instance details

Defined in Util.Positive

Ord Pos 
Instance details

Defined in Michelson.ErrorPos

Methods

compare :: Pos -> Pos -> Ordering #

(<) :: Pos -> Pos -> Bool #

(<=) :: Pos -> Pos -> Bool #

(>) :: Pos -> Pos -> Bool #

(>=) :: Pos -> Pos -> Bool #

max :: Pos -> Pos -> Pos #

min :: Pos -> Pos -> Pos #

Ord SrcPos 
Instance details

Defined in Michelson.ErrorPos

Ord LetName 
Instance details

Defined in Michelson.ErrorPos

Ord InstrCallStack 
Instance details

Defined in Michelson.ErrorPos

Ord Var 
Instance details

Defined in Michelson.Untyped.Ext

Methods

compare :: Var -> Var -> Ordering #

(<) :: Var -> Var -> Bool #

(<=) :: Var -> Var -> Bool #

(>) :: Var -> Var -> Bool #

(>=) :: Var -> Var -> Bool #

max :: Var -> Var -> Var #

min :: Var -> Var -> Var #

Ord Undefined 
Instance details

Defined in Universum.Debug

Ord ByteArray

Non-lexicographic ordering. This compares the lengths of the byte arrays first and uses a lexicographic ordering if the lengths are equal. Subject to change between major versions.

Since: primitive-0.6.3.0

Instance details

Defined in Data.Primitive.ByteArray

Ord ModName 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord PkgName 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord Module 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord OccName 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord NameFlavour 
Instance details

Defined in Language.Haskell.TH.Syntax

Ord DatatypeVariant 
Instance details

Defined in Language.Haskell.TH.Datatype

Ord ConstructorVariant 
Instance details

Defined in Language.Haskell.TH.Datatype

Ord FieldStrictness 
Instance details

Defined in Language.Haskell.TH.Datatype

Ord Unpackedness 
Instance details

Defined in Language.Haskell.TH.Datatype

Ord Strictness 
Instance details

Defined in Language.Haskell.TH.Datatype

Ord LocalTime 
Instance details

Defined in Data.Time.LocalTime.Internal.LocalTime

Ord UnpackedUUID 
Instance details

Defined in Data.UUID.Types.Internal

Methods

compare :: UnpackedUUID -> UnpackedUUID -> Ordering #

(<) :: UnpackedUUID -> UnpackedUUID -> Bool #

(<=) :: UnpackedUUID -> UnpackedUUID -> Bool #

(>) :: UnpackedUUID -> UnpackedUUID -> Bool #

(>=) :: UnpackedUUID -> UnpackedUUID -> Bool #

max :: UnpackedUUID -> UnpackedUUID -> UnpackedUUID #

min :: UnpackedUUID -> UnpackedUUID -> UnpackedUUID #

Ord UUID 
Instance details

Defined in Data.UUID.Types.Internal

Methods

compare :: UUID -> UUID -> Ordering #

(<) :: UUID -> UUID -> Bool #

(<=) :: UUID -> UUID -> Bool #

(>) :: UUID -> UUID -> Bool #

(>=) :: UUID -> UUID -> Bool #

max :: UUID -> UUID -> UUID #

min :: UUID -> UUID -> UUID #

Ord RefId Source # 
Instance details

Defined in Indigo.Internal.State

Methods

compare :: RefId -> RefId -> Ordering #

(<) :: RefId -> RefId -> Bool #

(<=) :: RefId -> RefId -> Bool #

(>) :: RefId -> RefId -> Bool #

(>=) :: RefId -> RefId -> Bool #

max :: RefId -> RefId -> RefId #

min :: RefId -> RefId -> RefId #

Ord Lambda1Def Source # 
Instance details

Defined in Indigo.Compilation.Lambda

() :=> (Ord Bool) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Ord Bool #

() :=> (Ord Char) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Ord Char #

() :=> (Ord Double) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Ord Double #

() :=> (Ord Float) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Ord Float #

() :=> (Ord Int) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Ord Int #

() :=> (Ord Integer) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Ord Integer #

() :=> (Ord Natural) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Ord Natural #

() :=> (Ord Word) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Ord Word #

() :=> (Ord ()) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Ord () #

() :=> (Ord (Dict a)) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Ord (Dict a) #

() :=> (Ord (a :- b)) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Ord (a :- b) #

Ord a => Ord [a] 
Instance details

Defined in GHC.Classes

Methods

compare :: [a] -> [a] -> Ordering #

(<) :: [a] -> [a] -> Bool #

(<=) :: [a] -> [a] -> Bool #

(>) :: [a] -> [a] -> Bool #

(>=) :: [a] -> [a] -> Bool #

max :: [a] -> [a] -> [a] #

min :: [a] -> [a] -> [a] #

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 #

Integral a => Ord (Ratio a)

Since: base-2.0.1

Instance details

Defined in GHC.Real

Methods

compare :: Ratio a -> Ratio a -> Ordering #

(<) :: Ratio a -> Ratio a -> Bool #

(<=) :: Ratio a -> Ratio a -> Bool #

(>) :: Ratio a -> Ratio a -> Bool #

(>=) :: Ratio a -> Ratio a -> Bool #

max :: Ratio a -> Ratio a -> Ratio a #

min :: Ratio a -> Ratio a -> Ratio a #

Ord (Ptr a)

Since: base-2.1

Instance details

Defined in GHC.Ptr

Methods

compare :: Ptr a -> Ptr a -> Ordering #

(<) :: Ptr a -> Ptr a -> Bool #

(<=) :: Ptr a -> Ptr a -> Bool #

(>) :: Ptr a -> Ptr a -> Bool #

(>=) :: Ptr a -> Ptr a -> Bool #

max :: Ptr a -> Ptr a -> Ptr a #

min :: Ptr a -> Ptr a -> Ptr a #

Ord (FunPtr a) 
Instance details

Defined in GHC.Ptr

Methods

compare :: FunPtr a -> FunPtr a -> Ordering #

(<) :: FunPtr a -> FunPtr a -> Bool #

(<=) :: FunPtr a -> FunPtr a -> Bool #

(>) :: FunPtr a -> FunPtr a -> Bool #

(>=) :: FunPtr a -> FunPtr a -> Bool #

max :: FunPtr a -> FunPtr a -> FunPtr a #

min :: FunPtr a -> FunPtr a -> FunPtr a #

Ord p => Ord (Par1 p)

Since: base-4.7.0.0

Instance details

Defined in GHC.Generics

Methods

compare :: Par1 p -> Par1 p -> Ordering #

(<) :: Par1 p -> Par1 p -> Bool #

(<=) :: Par1 p -> Par1 p -> Bool #

(>) :: Par1 p -> Par1 p -> Bool #

(>=) :: Par1 p -> Par1 p -> Bool #

max :: Par1 p -> Par1 p -> Par1 p #

min :: Par1 p -> Par1 p -> Par1 p #

Ord a => Ord (Min a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

compare :: Min a -> Min a -> Ordering #

(<) :: Min a -> Min a -> Bool #

(<=) :: Min a -> Min a -> Bool #

(>) :: Min a -> Min a -> Bool #

(>=) :: Min a -> Min a -> Bool #

max :: Min a -> Min a -> Min a #

min :: Min a -> Min a -> Min a #

Ord a => Ord (Max a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

compare :: Max a -> Max a -> Ordering #

(<) :: Max a -> Max a -> Bool #

(<=) :: Max a -> Max a -> Bool #

(>) :: Max a -> Max a -> Bool #

(>=) :: Max a -> Max a -> Bool #

max :: Max a -> Max a -> Max a #

min :: Max a -> Max a -> Max a #

Ord a => Ord (First a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

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 #

Ord a => Ord (Last a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

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 #

Ord m => Ord (WrappedMonoid m)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Ord a => Ord (Option a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

compare :: Option a -> Option a -> Ordering #

(<) :: Option a -> Option a -> Bool #

(<=) :: Option a -> Option a -> Bool #

(>) :: Option a -> Option a -> Bool #

(>=) :: Option a -> Option a -> Bool #

max :: Option a -> Option a -> Option a #

min :: Option a -> Option a -> Option a #

Ord a => Ord (ZipList a)

Since: base-4.7.0.0

Instance details

Defined in Control.Applicative

Methods

compare :: ZipList a -> ZipList a -> Ordering #

(<) :: ZipList a -> ZipList a -> Bool #

(<=) :: ZipList a -> ZipList a -> Bool #

(>) :: ZipList a -> ZipList a -> Bool #

(>=) :: ZipList a -> ZipList a -> Bool #

max :: ZipList a -> ZipList a -> ZipList a #

min :: ZipList a -> ZipList a -> ZipList a #

Ord a => Ord (Identity a)

Since: base-4.8.0.0

Instance details

Defined in Data.Functor.Identity

Methods

compare :: Identity a -> Identity a -> Ordering #

(<) :: Identity a -> Identity a -> Bool #

(<=) :: Identity a -> Identity a -> Bool #

(>) :: Identity a -> Identity a -> Bool #

(>=) :: Identity a -> Identity a -> Bool #

max :: Identity a -> Identity a -> Identity a #

min :: Identity a -> Identity a -> Identity a #

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 #

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 #

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 #

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 #

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 #

Ord a => Ord (Down a)

Since: base-4.6.0.0

Instance details

Defined in Data.Ord

Methods

compare :: Down a -> Down a -> Ordering #

(<) :: Down a -> Down a -> Bool #

(<=) :: Down a -> Down a -> Bool #

(>) :: Down a -> Down a -> Bool #

(>=) :: Down a -> Down a -> Bool #

max :: Down a -> Down a -> Down a #

min :: Down a -> Down a -> Down a #

Ord a => Ord (NonEmpty a)

Since: base-4.9.0.0

Instance details

Defined in GHC.Base

Methods

compare :: NonEmpty a -> NonEmpty a -> Ordering #

(<) :: NonEmpty a -> NonEmpty a -> Bool #

(<=) :: NonEmpty a -> NonEmpty a -> Bool #

(>) :: NonEmpty a -> NonEmpty a -> Bool #

(>=) :: NonEmpty a -> NonEmpty a -> Bool #

max :: NonEmpty a -> NonEmpty a -> NonEmpty a #

min :: NonEmpty a -> NonEmpty a -> NonEmpty a #

(PrimType ty, Ord ty) => Ord (UArray ty) 
Instance details

Defined in Basement.UArray.Base

Methods

compare :: UArray ty -> UArray ty -> Ordering #

(<) :: UArray ty -> UArray ty -> Bool #

(<=) :: UArray ty -> UArray ty -> Bool #

(>) :: UArray ty -> UArray ty -> Bool #

(>=) :: UArray ty -> UArray ty -> Bool #

max :: UArray ty -> UArray ty -> UArray ty #

min :: UArray ty -> UArray ty -> UArray ty #

(PrimType ty, Ord ty) => Ord (Block ty) 
Instance details

Defined in Basement.Block.Base

Methods

compare :: Block ty -> Block ty -> Ordering #

(<) :: Block ty -> Block ty -> Bool #

(<=) :: Block ty -> Block ty -> Bool #

(>) :: Block ty -> Block ty -> Bool #

(>=) :: Block ty -> Block ty -> Bool #

max :: Block ty -> Block ty -> Block ty #

min :: Block ty -> Block ty -> Block ty #

Ord (Offset ty) 
Instance details

Defined in Basement.Types.OffsetSize

Methods

compare :: Offset ty -> Offset ty -> Ordering #

(<) :: Offset ty -> Offset ty -> Bool #

(<=) :: Offset ty -> Offset ty -> Bool #

(>) :: Offset ty -> Offset ty -> Bool #

(>=) :: Offset ty -> Offset ty -> Bool #

max :: Offset ty -> Offset ty -> Offset ty #

min :: Offset ty -> Offset ty -> Offset ty #

Ord (CountOf ty) 
Instance details

Defined in Basement.Types.OffsetSize

Methods

compare :: CountOf ty -> CountOf ty -> Ordering #

(<) :: CountOf ty -> CountOf ty -> Bool #

(<=) :: CountOf ty -> CountOf ty -> Bool #

(>) :: CountOf ty -> CountOf ty -> Bool #

(>=) :: CountOf ty -> CountOf ty -> Bool #

max :: CountOf ty -> CountOf ty -> CountOf ty #

min :: CountOf ty -> CountOf ty -> CountOf ty #

Ord (Zn64 n) 
Instance details

Defined in Basement.Bounded

Methods

compare :: Zn64 n -> Zn64 n -> Ordering #

(<) :: Zn64 n -> Zn64 n -> Bool #

(<=) :: Zn64 n -> Zn64 n -> Bool #

(>) :: Zn64 n -> Zn64 n -> Bool #

(>=) :: Zn64 n -> Zn64 n -> Bool #

max :: Zn64 n -> Zn64 n -> Zn64 n #

min :: Zn64 n -> Zn64 n -> Zn64 n #

Ord (Zn n) 
Instance details

Defined in Basement.Bounded

Methods

compare :: Zn n -> Zn n -> Ordering #

(<) :: Zn n -> Zn n -> Bool #

(<=) :: Zn n -> Zn n -> Bool #

(>) :: Zn n -> Zn n -> Bool #

(>=) :: Zn n -> Zn n -> Bool #

max :: Zn n -> Zn n -> Zn n #

min :: Zn n -> Zn n -> Zn n #

Ord (Dict a) 
Instance details

Defined in Data.Constraint

Methods

compare :: Dict a -> Dict a -> Ordering #

(<) :: Dict a -> Dict a -> Bool #

(<=) :: Dict a -> Dict a -> Bool #

(>) :: Dict a -> Dict a -> Bool #

(>=) :: Dict a -> Dict a -> Bool #

max :: Dict a -> Dict a -> Dict a #

min :: Dict a -> Dict a -> Dict a #

Ord a => Ord (IntMap a) 
Instance details

Defined in Data.IntMap.Internal

Methods

compare :: IntMap a -> IntMap a -> Ordering #

(<) :: IntMap a -> IntMap a -> Bool #

(<=) :: IntMap a -> IntMap a -> Bool #

(>) :: IntMap a -> IntMap a -> Bool #

(>=) :: IntMap a -> IntMap a -> Bool #

max :: IntMap a -> IntMap a -> IntMap a #

min :: IntMap a -> IntMap a -> IntMap a #

Ord a => Ord (Seq a) 
Instance details

Defined in Data.Sequence.Internal

Methods

compare :: Seq a -> Seq a -> Ordering #

(<) :: Seq a -> Seq a -> Bool #

(<=) :: Seq a -> Seq a -> Bool #

(>) :: Seq a -> Seq a -> Bool #

(>=) :: Seq a -> Seq a -> Bool #

max :: Seq a -> Seq a -> Seq a #

min :: Seq a -> Seq a -> Seq a #

Ord a => Ord (ViewL a) 
Instance details

Defined in Data.Sequence.Internal

Methods

compare :: ViewL a -> ViewL a -> Ordering #

(<) :: ViewL a -> ViewL a -> Bool #

(<=) :: ViewL a -> ViewL a -> Bool #

(>) :: ViewL a -> ViewL a -> Bool #

(>=) :: ViewL a -> ViewL a -> Bool #

max :: ViewL a -> ViewL a -> ViewL a #

min :: ViewL a -> ViewL a -> ViewL a #

Ord a => Ord (ViewR a) 
Instance details

Defined in Data.Sequence.Internal

Methods

compare :: ViewR a -> ViewR a -> Ordering #

(<) :: ViewR a -> ViewR a -> Bool #

(<=) :: ViewR a -> ViewR a -> Bool #

(>) :: ViewR a -> ViewR a -> Bool #

(>=) :: ViewR a -> ViewR a -> Bool #

max :: ViewR a -> ViewR a -> ViewR a #

min :: ViewR a -> ViewR a -> ViewR a #

Ord a => Ord (Set a) 
Instance details

Defined in Data.Set.Internal

Methods

compare :: Set a -> Set a -> Ordering #

(<) :: Set a -> Set a -> Bool #

(<=) :: Set a -> Set a -> Bool #

(>) :: Set a -> Set a -> Bool #

(>=) :: Set a -> Set a -> Bool #

max :: Set a -> Set a -> Set a #

min :: Set a -> Set a -> Set a #

Ord a => Ord (DList a) 
Instance details

Defined in Data.DList

Methods

compare :: DList a -> DList a -> Ordering #

(<) :: DList a -> DList a -> Bool #

(<=) :: DList a -> DList a -> Bool #

(>) :: DList a -> DList a -> Bool #

(>=) :: DList a -> DList a -> Bool #

max :: DList a -> DList a -> DList a #

min :: DList a -> DList a -> DList a #

Ord a => Ord (Hashed a) 
Instance details

Defined in Data.Hashable.Class

Methods

compare :: Hashed a -> Hashed a -> Ordering #

(<) :: Hashed a -> Hashed a -> Bool #

(<=) :: Hashed a -> Hashed a -> Bool #

(>) :: Hashed a -> Hashed a -> Bool #

(>=) :: Hashed a -> Hashed a -> Bool #

max :: Hashed a -> Hashed a -> Hashed a #

min :: Hashed a -> Hashed a -> Hashed a #

Ord l => Ord (PragmasAndModuleName l) 
Instance details

Defined in Language.Haskell.Exts.Parser

Ord l => Ord (PragmasAndModuleHead l) 
Instance details

Defined in Language.Haskell.Exts.Parser

Ord l => Ord (ModuleHeadAndImports l) 
Instance details

Defined in Language.Haskell.Exts.Parser

Ord a => Ord (NonGreedy a) 
Instance details

Defined in Language.Haskell.Exts.Parser

Ord a => Ord (ListOf a) 
Instance details

Defined in Language.Haskell.Exts.Parser

Methods

compare :: ListOf a -> ListOf a -> Ordering #

(<) :: ListOf a -> ListOf a -> Bool #

(<=) :: ListOf a -> ListOf a -> Bool #

(>) :: ListOf a -> ListOf a -> Bool #

(>=) :: ListOf a -> ListOf a -> Bool #

max :: ListOf a -> ListOf a -> ListOf a #

min :: ListOf a -> ListOf a -> ListOf a #

Ord l => Ord (ModuleName l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Ord l => Ord (SpecialCon l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Ord l => Ord (QName l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: QName l -> QName l -> Ordering #

(<) :: QName l -> QName l -> Bool #

(<=) :: QName l -> QName l -> Bool #

(>) :: QName l -> QName l -> Bool #

(>=) :: QName l -> QName l -> Bool #

max :: QName l -> QName l -> QName l #

min :: QName l -> QName l -> QName l #

Ord l => Ord (Name l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: Name l -> Name l -> Ordering #

(<) :: Name l -> Name l -> Bool #

(<=) :: Name l -> Name l -> Bool #

(>) :: Name l -> Name l -> Bool #

(>=) :: Name l -> Name l -> Bool #

max :: Name l -> Name l -> Name l #

min :: Name l -> Name l -> Name l #

Ord l => Ord (IPName l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: IPName l -> IPName l -> Ordering #

(<) :: IPName l -> IPName l -> Bool #

(<=) :: IPName l -> IPName l -> Bool #

(>) :: IPName l -> IPName l -> Bool #

(>=) :: IPName l -> IPName l -> Bool #

max :: IPName l -> IPName l -> IPName l #

min :: IPName l -> IPName l -> IPName l #

Ord l => Ord (QOp l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: QOp l -> QOp l -> Ordering #

(<) :: QOp l -> QOp l -> Bool #

(<=) :: QOp l -> QOp l -> Bool #

(>) :: QOp l -> QOp l -> Bool #

(>=) :: QOp l -> QOp l -> Bool #

max :: QOp l -> QOp l -> QOp l #

min :: QOp l -> QOp l -> QOp l #

Ord l => Ord (Op l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: Op l -> Op l -> Ordering #

(<) :: Op l -> Op l -> Bool #

(<=) :: Op l -> Op l -> Bool #

(>) :: Op l -> Op l -> Bool #

(>=) :: Op l -> Op l -> Bool #

max :: Op l -> Op l -> Op l #

min :: Op l -> Op l -> Op l #

Ord l => Ord (CName l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: CName l -> CName l -> Ordering #

(<) :: CName l -> CName l -> Bool #

(<=) :: CName l -> CName l -> Bool #

(>) :: CName l -> CName l -> Bool #

(>=) :: CName l -> CName l -> Bool #

max :: CName l -> CName l -> CName l #

min :: CName l -> CName l -> CName l #

Ord l => Ord (Module l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: Module l -> Module l -> Ordering #

(<) :: Module l -> Module l -> Bool #

(<=) :: Module l -> Module l -> Bool #

(>) :: Module l -> Module l -> Bool #

(>=) :: Module l -> Module l -> Bool #

max :: Module l -> Module l -> Module l #

min :: Module l -> Module l -> Module l #

Ord l => Ord (ModuleHead l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Ord l => Ord (ExportSpecList l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Ord l => Ord (ExportSpec l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Ord l => Ord (EWildcard l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Ord l => Ord (Namespace l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Ord l => Ord (ImportDecl l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Ord l => Ord (ImportSpecList l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Ord l => Ord (ImportSpec l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Ord l => Ord (Assoc l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: Assoc l -> Assoc l -> Ordering #

(<) :: Assoc l -> Assoc l -> Bool #

(<=) :: Assoc l -> Assoc l -> Bool #

(>) :: Assoc l -> Assoc l -> Bool #

(>=) :: Assoc l -> Assoc l -> Bool #

max :: Assoc l -> Assoc l -> Assoc l #

min :: Assoc l -> Assoc l -> Assoc l #

Ord l => Ord (Decl l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: Decl l -> Decl l -> Ordering #

(<) :: Decl l -> Decl l -> Bool #

(<=) :: Decl l -> Decl l -> Bool #

(>) :: Decl l -> Decl l -> Bool #

(>=) :: Decl l -> Decl l -> Bool #

max :: Decl l -> Decl l -> Decl l #

min :: Decl l -> Decl l -> Decl l #

Ord l => Ord (PatternSynDirection l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Ord l => Ord (TypeEqn l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: TypeEqn l -> TypeEqn l -> Ordering #

(<) :: TypeEqn l -> TypeEqn l -> Bool #

(<=) :: TypeEqn l -> TypeEqn l -> Bool #

(>) :: TypeEqn l -> TypeEqn l -> Bool #

(>=) :: TypeEqn l -> TypeEqn l -> Bool #

max :: TypeEqn l -> TypeEqn l -> TypeEqn l #

min :: TypeEqn l -> TypeEqn l -> TypeEqn l #

Ord l => Ord (Annotation l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Ord l => Ord (BooleanFormula l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Ord l => Ord (Role l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: Role l -> Role l -> Ordering #

(<) :: Role l -> Role l -> Bool #

(<=) :: Role l -> Role l -> Bool #

(>) :: Role l -> Role l -> Bool #

(>=) :: Role l -> Role l -> Bool #

max :: Role l -> Role l -> Role l #

min :: Role l -> Role l -> Role l #

Ord l => Ord (DataOrNew l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Ord l => Ord (InjectivityInfo l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Ord l => Ord (ResultSig l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Ord l => Ord (DeclHead l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: DeclHead l -> DeclHead l -> Ordering #

(<) :: DeclHead l -> DeclHead l -> Bool #

(<=) :: DeclHead l -> DeclHead l -> Bool #

(>) :: DeclHead l -> DeclHead l -> Bool #

(>=) :: DeclHead l -> DeclHead l -> Bool #

max :: DeclHead l -> DeclHead l -> DeclHead l #

min :: DeclHead l -> DeclHead l -> DeclHead l #

Ord l => Ord (InstRule l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: InstRule l -> InstRule l -> Ordering #

(<) :: InstRule l -> InstRule l -> Bool #

(<=) :: InstRule l -> InstRule l -> Bool #

(>) :: InstRule l -> InstRule l -> Bool #

(>=) :: InstRule l -> InstRule l -> Bool #

max :: InstRule l -> InstRule l -> InstRule l #

min :: InstRule l -> InstRule l -> InstRule l #

Ord l => Ord (InstHead l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: InstHead l -> InstHead l -> Ordering #

(<) :: InstHead l -> InstHead l -> Bool #

(<=) :: InstHead l -> InstHead l -> Bool #

(>) :: InstHead l -> InstHead l -> Bool #

(>=) :: InstHead l -> InstHead l -> Bool #

max :: InstHead l -> InstHead l -> InstHead l #

min :: InstHead l -> InstHead l -> InstHead l #

Ord l => Ord (Deriving l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: Deriving l -> Deriving l -> Ordering #

(<) :: Deriving l -> Deriving l -> Bool #

(<=) :: Deriving l -> Deriving l -> Bool #

(>) :: Deriving l -> Deriving l -> Bool #

(>=) :: Deriving l -> Deriving l -> Bool #

max :: Deriving l -> Deriving l -> Deriving l #

min :: Deriving l -> Deriving l -> Deriving l #

Ord l => Ord (DerivStrategy l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Ord l => Ord (Binds l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: Binds l -> Binds l -> Ordering #

(<) :: Binds l -> Binds l -> Bool #

(<=) :: Binds l -> Binds l -> Bool #

(>) :: Binds l -> Binds l -> Bool #

(>=) :: Binds l -> Binds l -> Bool #

max :: Binds l -> Binds l -> Binds l #

min :: Binds l -> Binds l -> Binds l #

Ord l => Ord (IPBind l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: IPBind l -> IPBind l -> Ordering #

(<) :: IPBind l -> IPBind l -> Bool #

(<=) :: IPBind l -> IPBind l -> Bool #

(>) :: IPBind l -> IPBind l -> Bool #

(>=) :: IPBind l -> IPBind l -> Bool #

max :: IPBind l -> IPBind l -> IPBind l #

min :: IPBind l -> IPBind l -> IPBind l #

Ord l => Ord (Match l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: Match l -> Match l -> Ordering #

(<) :: Match l -> Match l -> Bool #

(<=) :: Match l -> Match l -> Bool #

(>) :: Match l -> Match l -> Bool #

(>=) :: Match l -> Match l -> Bool #

max :: Match l -> Match l -> Match l #

min :: Match l -> Match l -> Match l #

Ord l => Ord (QualConDecl l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Ord l => Ord (ConDecl l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: ConDecl l -> ConDecl l -> Ordering #

(<) :: ConDecl l -> ConDecl l -> Bool #

(<=) :: ConDecl l -> ConDecl l -> Bool #

(>) :: ConDecl l -> ConDecl l -> Bool #

(>=) :: ConDecl l -> ConDecl l -> Bool #

max :: ConDecl l -> ConDecl l -> ConDecl l #

min :: ConDecl l -> ConDecl l -> ConDecl l #

Ord l => Ord (FieldDecl l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Ord l => Ord (GadtDecl l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: GadtDecl l -> GadtDecl l -> Ordering #

(<) :: GadtDecl l -> GadtDecl l -> Bool #

(<=) :: GadtDecl l -> GadtDecl l -> Bool #

(>) :: GadtDecl l -> GadtDecl l -> Bool #

(>=) :: GadtDecl l -> GadtDecl l -> Bool #

max :: GadtDecl l -> GadtDecl l -> GadtDecl l #

min :: GadtDecl l -> GadtDecl l -> GadtDecl l #

Ord l => Ord (ClassDecl l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Ord l => Ord (InstDecl l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: InstDecl l -> InstDecl l -> Ordering #

(<) :: InstDecl l -> InstDecl l -> Bool #

(<=) :: InstDecl l -> InstDecl l -> Bool #

(>) :: InstDecl l -> InstDecl l -> Bool #

(>=) :: InstDecl l -> InstDecl l -> Bool #

max :: InstDecl l -> InstDecl l -> InstDecl l #

min :: InstDecl l -> InstDecl l -> InstDecl l #

Ord l => Ord (BangType l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: BangType l -> BangType l -> Ordering #

(<) :: BangType l -> BangType l -> Bool #

(<=) :: BangType l -> BangType l -> Bool #

(>) :: BangType l -> BangType l -> Bool #

(>=) :: BangType l -> BangType l -> Bool #

max :: BangType l -> BangType l -> BangType l #

min :: BangType l -> BangType l -> BangType l #

Ord l => Ord (Unpackedness l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Ord l => Ord (Rhs l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: Rhs l -> Rhs l -> Ordering #

(<) :: Rhs l -> Rhs l -> Bool #

(<=) :: Rhs l -> Rhs l -> Bool #

(>) :: Rhs l -> Rhs l -> Bool #

(>=) :: Rhs l -> Rhs l -> Bool #

max :: Rhs l -> Rhs l -> Rhs l #

min :: Rhs l -> Rhs l -> Rhs l #

Ord l => Ord (GuardedRhs l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Ord l => Ord (Type l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: Type l -> Type l -> Ordering #

(<) :: Type l -> Type l -> Bool #

(<=) :: Type l -> Type l -> Bool #

(>) :: Type l -> Type l -> Bool #

(>=) :: Type l -> Type l -> Bool #

max :: Type l -> Type l -> Type l #

min :: Type l -> Type l -> Type l #

Ord l => Ord (MaybePromotedName l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Ord l => Ord (Promoted l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: Promoted l -> Promoted l -> Ordering #

(<) :: Promoted l -> Promoted l -> Bool #

(<=) :: Promoted l -> Promoted l -> Bool #

(>) :: Promoted l -> Promoted l -> Bool #

(>=) :: Promoted l -> Promoted l -> Bool #

max :: Promoted l -> Promoted l -> Promoted l #

min :: Promoted l -> Promoted l -> Promoted l #

Ord l => Ord (TyVarBind l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Ord l => Ord (FunDep l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: FunDep l -> FunDep l -> Ordering #

(<) :: FunDep l -> FunDep l -> Bool #

(<=) :: FunDep l -> FunDep l -> Bool #

(>) :: FunDep l -> FunDep l -> Bool #

(>=) :: FunDep l -> FunDep l -> Bool #

max :: FunDep l -> FunDep l -> FunDep l #

min :: FunDep l -> FunDep l -> FunDep l #

Ord l => Ord (Context l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: Context l -> Context l -> Ordering #

(<) :: Context l -> Context l -> Bool #

(<=) :: Context l -> Context l -> Bool #

(>) :: Context l -> Context l -> Bool #

(>=) :: Context l -> Context l -> Bool #

max :: Context l -> Context l -> Context l #

min :: Context l -> Context l -> Context l #

Ord l => Ord (Asst l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: Asst l -> Asst l -> Ordering #

(<) :: Asst l -> Asst l -> Bool #

(<=) :: Asst l -> Asst l -> Bool #

(>) :: Asst l -> Asst l -> Bool #

(>=) :: Asst l -> Asst l -> Bool #

max :: Asst l -> Asst l -> Asst l #

min :: Asst l -> Asst l -> Asst l #

Ord l => Ord (Literal l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: Literal l -> Literal l -> Ordering #

(<) :: Literal l -> Literal l -> Bool #

(<=) :: Literal l -> Literal l -> Bool #

(>) :: Literal l -> Literal l -> Bool #

(>=) :: Literal l -> Literal l -> Bool #

max :: Literal l -> Literal l -> Literal l #

min :: Literal l -> Literal l -> Literal l #

Ord l => Ord (Sign l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: Sign l -> Sign l -> Ordering #

(<) :: Sign l -> Sign l -> Bool #

(<=) :: Sign l -> Sign l -> Bool #

(>) :: Sign l -> Sign l -> Bool #

(>=) :: Sign l -> Sign l -> Bool #

max :: Sign l -> Sign l -> Sign l #

min :: Sign l -> Sign l -> Sign l #

Ord l => Ord (Exp l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: Exp l -> Exp l -> Ordering #

(<) :: Exp l -> Exp l -> Bool #

(<=) :: Exp l -> Exp l -> Bool #

(>) :: Exp l -> Exp l -> Bool #

(>=) :: Exp l -> Exp l -> Bool #

max :: Exp l -> Exp l -> Exp l #

min :: Exp l -> Exp l -> Exp l #

Ord l => Ord (XName l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: XName l -> XName l -> Ordering #

(<) :: XName l -> XName l -> Bool #

(<=) :: XName l -> XName l -> Bool #

(>) :: XName l -> XName l -> Bool #

(>=) :: XName l -> XName l -> Bool #

max :: XName l -> XName l -> XName l #

min :: XName l -> XName l -> XName l #

Ord l => Ord (XAttr l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: XAttr l -> XAttr l -> Ordering #

(<) :: XAttr l -> XAttr l -> Bool #

(<=) :: XAttr l -> XAttr l -> Bool #

(>) :: XAttr l -> XAttr l -> Bool #

(>=) :: XAttr l -> XAttr l -> Bool #

max :: XAttr l -> XAttr l -> XAttr l #

min :: XAttr l -> XAttr l -> XAttr l #

Ord l => Ord (Bracket l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: Bracket l -> Bracket l -> Ordering #

(<) :: Bracket l -> Bracket l -> Bool #

(<=) :: Bracket l -> Bracket l -> Bool #

(>) :: Bracket l -> Bracket l -> Bool #

(>=) :: Bracket l -> Bracket l -> Bool #

max :: Bracket l -> Bracket l -> Bracket l #

min :: Bracket l -> Bracket l -> Bracket l #

Ord l => Ord (Splice l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: Splice l -> Splice l -> Ordering #

(<) :: Splice l -> Splice l -> Bool #

(<=) :: Splice l -> Splice l -> Bool #

(>) :: Splice l -> Splice l -> Bool #

(>=) :: Splice l -> Splice l -> Bool #

max :: Splice l -> Splice l -> Splice l #

min :: Splice l -> Splice l -> Splice l #

Ord l => Ord (Safety l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: Safety l -> Safety l -> Ordering #

(<) :: Safety l -> Safety l -> Bool #

(<=) :: Safety l -> Safety l -> Bool #

(>) :: Safety l -> Safety l -> Bool #

(>=) :: Safety l -> Safety l -> Bool #

max :: Safety l -> Safety l -> Safety l #

min :: Safety l -> Safety l -> Safety l #

Ord l => Ord (CallConv l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: CallConv l -> CallConv l -> Ordering #

(<) :: CallConv l -> CallConv l -> Bool #

(<=) :: CallConv l -> CallConv l -> Bool #

(>) :: CallConv l -> CallConv l -> Bool #

(>=) :: CallConv l -> CallConv l -> Bool #

max :: CallConv l -> CallConv l -> CallConv l #

min :: CallConv l -> CallConv l -> CallConv l #

Ord l => Ord (ModulePragma l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Ord l => Ord (Overlap l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: Overlap l -> Overlap l -> Ordering #

(<) :: Overlap l -> Overlap l -> Bool #

(<=) :: Overlap l -> Overlap l -> Bool #

(>) :: Overlap l -> Overlap l -> Bool #

(>=) :: Overlap l -> Overlap l -> Bool #

max :: Overlap l -> Overlap l -> Overlap l #

min :: Overlap l -> Overlap l -> Overlap l #

Ord l => Ord (Activation l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Ord l => Ord (Rule l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: Rule l -> Rule l -> Ordering #

(<) :: Rule l -> Rule l -> Bool #

(<=) :: Rule l -> Rule l -> Bool #

(>) :: Rule l -> Rule l -> Bool #

(>=) :: Rule l -> Rule l -> Bool #

max :: Rule l -> Rule l -> Rule l #

min :: Rule l -> Rule l -> Rule l #

Ord l => Ord (RuleVar l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: RuleVar l -> RuleVar l -> Ordering #

(<) :: RuleVar l -> RuleVar l -> Bool #

(<=) :: RuleVar l -> RuleVar l -> Bool #

(>) :: RuleVar l -> RuleVar l -> Bool #

(>=) :: RuleVar l -> RuleVar l -> Bool #

max :: RuleVar l -> RuleVar l -> RuleVar l #

min :: RuleVar l -> RuleVar l -> RuleVar l #

Ord l => Ord (WarningText l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Ord l => Ord (Pat l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: Pat l -> Pat l -> Ordering #

(<) :: Pat l -> Pat l -> Bool #

(<=) :: Pat l -> Pat l -> Bool #

(>) :: Pat l -> Pat l -> Bool #

(>=) :: Pat l -> Pat l -> Bool #

max :: Pat l -> Pat l -> Pat l #

min :: Pat l -> Pat l -> Pat l #

Ord l => Ord (PXAttr l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: PXAttr l -> PXAttr l -> Ordering #

(<) :: PXAttr l -> PXAttr l -> Bool #

(<=) :: PXAttr l -> PXAttr l -> Bool #

(>) :: PXAttr l -> PXAttr l -> Bool #

(>=) :: PXAttr l -> PXAttr l -> Bool #

max :: PXAttr l -> PXAttr l -> PXAttr l #

min :: PXAttr l -> PXAttr l -> PXAttr l #

Ord l => Ord (RPatOp l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: RPatOp l -> RPatOp l -> Ordering #

(<) :: RPatOp l -> RPatOp l -> Bool #

(<=) :: RPatOp l -> RPatOp l -> Bool #

(>) :: RPatOp l -> RPatOp l -> Bool #

(>=) :: RPatOp l -> RPatOp l -> Bool #

max :: RPatOp l -> RPatOp l -> RPatOp l #

min :: RPatOp l -> RPatOp l -> RPatOp l #

Ord l => Ord (RPat l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: RPat l -> RPat l -> Ordering #

(<) :: RPat l -> RPat l -> Bool #

(<=) :: RPat l -> RPat l -> Bool #

(>) :: RPat l -> RPat l -> Bool #

(>=) :: RPat l -> RPat l -> Bool #

max :: RPat l -> RPat l -> RPat l #

min :: RPat l -> RPat l -> RPat l #

Ord l => Ord (PatField l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: PatField l -> PatField l -> Ordering #

(<) :: PatField l -> PatField l -> Bool #

(<=) :: PatField l -> PatField l -> Bool #

(>) :: PatField l -> PatField l -> Bool #

(>=) :: PatField l -> PatField l -> Bool #

max :: PatField l -> PatField l -> PatField l #

min :: PatField l -> PatField l -> PatField l #

Ord l => Ord (Stmt l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: Stmt l -> Stmt l -> Ordering #

(<) :: Stmt l -> Stmt l -> Bool #

(<=) :: Stmt l -> Stmt l -> Bool #

(>) :: Stmt l -> Stmt l -> Bool #

(>=) :: Stmt l -> Stmt l -> Bool #

max :: Stmt l -> Stmt l -> Stmt l #

min :: Stmt l -> Stmt l -> Stmt l #

Ord l => Ord (QualStmt l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: QualStmt l -> QualStmt l -> Ordering #

(<) :: QualStmt l -> QualStmt l -> Bool #

(<=) :: QualStmt l -> QualStmt l -> Bool #

(>) :: QualStmt l -> QualStmt l -> Bool #

(>=) :: QualStmt l -> QualStmt l -> Bool #

max :: QualStmt l -> QualStmt l -> QualStmt l #

min :: QualStmt l -> QualStmt l -> QualStmt l #

Ord l => Ord (FieldUpdate l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Ord l => Ord (Alt l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: Alt l -> Alt l -> Ordering #

(<) :: Alt l -> Alt l -> Bool #

(<=) :: Alt l -> Alt l -> Bool #

(>) :: Alt l -> Alt l -> Bool #

(>=) :: Alt l -> Alt l -> Bool #

max :: Alt l -> Alt l -> Alt l #

min :: Alt l -> Alt l -> Alt l #

Ord a => Ord (Loc a) 
Instance details

Defined in Language.Haskell.Exts.SrcLoc

Methods

compare :: Loc a -> Loc a -> Ordering #

(<) :: Loc a -> Loc a -> Bool #

(<=) :: Loc a -> Loc a -> Bool #

(>) :: Loc a -> Loc a -> Bool #

(>=) :: Loc a -> Loc a -> Bool #

max :: Loc a -> Loc a -> Loc a #

min :: Loc a -> Loc a -> Loc a #

(Prim a, Ord a) => Ord (Vector a) 
Instance details

Defined in Data.Vector.Primitive

Methods

compare :: Vector a -> Vector a -> Ordering #

(<) :: Vector a -> Vector a -> Bool #

(<=) :: Vector a -> Vector a -> Bool #

(>) :: Vector a -> Vector a -> Bool #

(>=) :: Vector a -> Vector a -> Bool #

max :: Vector a -> Vector a -> Vector a #

min :: Vector a -> Vector a -> Vector a #

(Storable a, Ord a) => Ord (Vector a) 
Instance details

Defined in Data.Vector.Storable

Methods

compare :: Vector a -> Vector a -> Ordering #

(<) :: Vector a -> Vector a -> Bool #

(<=) :: Vector a -> Vector a -> Bool #

(>) :: Vector a -> Vector a -> Bool #

(>=) :: Vector a -> Vector a -> Bool #

max :: Vector a -> Vector a -> Vector a #

min :: Vector a -> Vector a -> Vector a #

Ord a => Ord (HashSet a) 
Instance details

Defined in Data.HashSet.Base

Methods

compare :: HashSet a -> HashSet a -> Ordering #

(<) :: HashSet a -> HashSet a -> Bool #

(<=) :: HashSet a -> HashSet a -> Bool #

(>) :: HashSet a -> HashSet a -> Bool #

(>=) :: HashSet a -> HashSet a -> Bool #

max :: HashSet a -> HashSet a -> HashSet a #

min :: HashSet a -> HashSet a -> HashSet a #

Ord a => Ord (Vector a) 
Instance details

Defined in Data.Vector

Methods

compare :: Vector a -> Vector a -> Ordering #

(<) :: Vector a -> Vector a -> Bool #

(<=) :: Vector a -> Vector a -> Bool #

(>) :: Vector a -> Vector a -> Bool #

(>=) :: Vector a -> Vector a -> Bool #

max :: Vector a -> Vector a -> Vector a #

min :: Vector a -> Vector a -> Vector a #

Ord t => Ord (ErrorItem t) 
Instance details

Defined in Text.Megaparsec.Error

Ord e => Ord (ErrorFancy e) 
Instance details

Defined in Text.Megaparsec.Error

(Ord a, Prim a) => Ord (PrimArray a)

Lexicographic ordering. Subject to change between major versions.

Since: primitive-0.6.4.0

Instance details

Defined in Data.Primitive.PrimArray

Ord a => Ord (SmallArray a)

Lexicographic ordering. Subject to change between major versions.

Instance details

Defined in Data.Primitive.SmallArray

Ord a => Ord (Array a)

Lexicographic ordering. Subject to change between major versions.

Instance details

Defined in Data.Primitive.Array

Methods

compare :: Array a -> Array a -> Ordering #

(<) :: Array a -> Array a -> Bool #

(<=) :: Array a -> Array a -> Bool #

(>) :: Array a -> Array a -> Bool #

(>=) :: Array a -> Array a -> Bool #

max :: Array a -> Array a -> Array a #

min :: Array a -> Array a -> Array a #

Ord a => Ord (Identity a) 
Instance details

Defined in Data.Vinyl.Functor

Methods

compare :: Identity a -> Identity a -> Ordering #

(<) :: Identity a -> Identity a -> Bool #

(<=) :: Identity a -> Identity a -> Bool #

(>) :: Identity a -> Identity a -> Bool #

(>=) :: Identity a -> Identity a -> Bool #

max :: Identity a -> Identity a -> Identity a #

min :: Identity a -> Identity a -> Identity a #

Ord t => Ord (ElField '(s, t)) 
Instance details

Defined in Data.Vinyl.Functor

Methods

compare :: ElField '(s, t) -> ElField '(s, t) -> Ordering #

(<) :: ElField '(s, t) -> ElField '(s, t) -> Bool #

(<=) :: ElField '(s, t) -> ElField '(s, t) -> Bool #

(>) :: ElField '(s, t) -> ElField '(s, t) -> Bool #

(>=) :: ElField '(s, t) -> ElField '(s, t) -> Bool #

max :: ElField '(s, t) -> ElField '(s, t) -> ElField '(s, t) #

min :: ElField '(s, t) -> ElField '(s, t) -> ElField '(s, t) #

Class (Eq a) (Ord a) 
Instance details

Defined in Data.Constraint

Methods

cls :: Ord a :- Eq a #

(Integral a) :=> (Ord (Ratio a)) 
Instance details

Defined in Data.Constraint

Methods

ins :: Integral a :- Ord (Ratio a) #

(Ord a) :=> (Ord (Maybe a)) 
Instance details

Defined in Data.Constraint

Methods

ins :: Ord a :- Ord (Maybe a) #

(Ord a) :=> (Ord [a]) 
Instance details

Defined in Data.Constraint

Methods

ins :: Ord a :- Ord [a] #

(Ord a) :=> (Ord (Identity a)) 
Instance details

Defined in Data.Constraint

Methods

ins :: Ord a :- Ord (Identity a) #

(Ord a) :=> (Ord (Const a b)) 
Instance details

Defined in Data.Constraint

Methods

ins :: Ord a :- Ord (Const a b) #

(Ord a, Ord b) => Ord (Either a b)

Since: base-2.1

Instance details

Defined in Data.Either

Methods

compare :: Either a b -> Either a b -> Ordering #

(<) :: Either a b -> Either a b -> Bool #

(<=) :: Either a b -> Either a b -> Bool #

(>) :: Either a b -> Either a b -> Bool #

(>=) :: Either a b -> Either a b -> Bool #

max :: Either a b -> Either a b -> Either a b #

min :: Either a b -> Either a b -> Either a b #

Ord (V1 p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

compare :: V1 p -> V1 p -> Ordering #

(<) :: V1 p -> V1 p -> Bool #

(<=) :: V1 p -> V1 p -> Bool #

(>) :: V1 p -> V1 p -> Bool #

(>=) :: V1 p -> V1 p -> Bool #

max :: V1 p -> V1 p -> V1 p #

min :: V1 p -> V1 p -> V1 p #

Ord (U1 p)

Since: base-4.7.0.0

Instance details

Defined in GHC.Generics

Methods

compare :: U1 p -> U1 p -> Ordering #

(<) :: U1 p -> U1 p -> Bool #

(<=) :: U1 p -> U1 p -> Bool #

(>) :: U1 p -> U1 p -> Bool #

(>=) :: U1 p -> U1 p -> Bool #

max :: U1 p -> U1 p -> U1 p #

min :: U1 p -> U1 p -> U1 p #

Ord (TypeRep a)

Since: base-4.4.0.0

Instance details

Defined in Data.Typeable.Internal

Methods

compare :: TypeRep a -> TypeRep a -> Ordering #

(<) :: TypeRep a -> TypeRep a -> Bool #

(<=) :: TypeRep a -> TypeRep a -> Bool #

(>) :: TypeRep a -> TypeRep a -> Bool #

(>=) :: TypeRep a -> TypeRep a -> Bool #

max :: TypeRep a -> TypeRep a -> TypeRep a #

min :: TypeRep a -> TypeRep a -> TypeRep a #

(Ord a, Ord b) => Ord (a, b) 
Instance details

Defined in GHC.Classes

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) #

(Ord k, Ord v) => Ord (HashMap k v)

The order is total.

Note: Because the hash is not guaranteed to be stable across library versions, OSes, or architectures, neither is an actual order of elements in HashMap or an result of compare.is stable.

Instance details

Defined in Data.HashMap.Base

Methods

compare :: HashMap k v -> HashMap k v -> Ordering #

(<) :: HashMap k v -> HashMap k v -> Bool #

(<=) :: HashMap k v -> HashMap k v -> Bool #

(>) :: HashMap k v -> HashMap k v -> Bool #

(>=) :: HashMap k v -> HashMap k v -> Bool #

max :: HashMap k v -> HashMap k v -> HashMap k v #

min :: HashMap k v -> HashMap k v -> HashMap k v #

(Ord k, Ord v) => Ord (Map k v) 
Instance details

Defined in Data.Map.Internal

Methods

compare :: Map k v -> Map k v -> Ordering #

(<) :: Map k v -> Map k v -> Bool #

(<=) :: Map k v -> Map k v -> Bool #

(>) :: Map k v -> Map k v -> Bool #

(>=) :: Map k v -> Map k v -> Bool #

max :: Map k v -> Map k v -> Map k v #

min :: Map k v -> Map k v -> Map k v #

Ord a => Ord (Arg a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

compare :: Arg a b -> Arg a b -> Ordering #

(<) :: Arg a b -> Arg a b -> Bool #

(<=) :: Arg a b -> Arg a b -> Bool #

(>) :: Arg a b -> Arg a b -> Bool #

(>=) :: Arg a b -> Arg a b -> Bool #

max :: Arg a b -> Arg a b -> Arg a b #

min :: Arg a b -> Arg a b -> Arg a b #

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 #

(Ord a, Ord b) => Ord (Bimap a b) 
Instance details

Defined in Data.Bimap

Methods

compare :: Bimap a b -> Bimap a b -> Ordering #

(<) :: Bimap a b -> Bimap a b -> Bool #

(<=) :: Bimap a b -> Bimap a b -> Bool #

(>) :: Bimap a b -> Bimap a b -> Bool #

(>=) :: Bimap a b -> Bimap a b -> Bool #

max :: Bimap a b -> Bimap a b -> Bimap a b #

min :: Bimap a b -> Bimap a b -> Bimap a b #

Ord (a :- b)

Assumes IncoherentInstances doesn't exist.

Instance details

Defined in Data.Constraint

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 #

(Ord1 m, Ord a) => Ord (MaybeT m a) 
Instance details

Defined in Control.Monad.Trans.Maybe

Methods

compare :: MaybeT m a -> MaybeT m a -> Ordering #

(<) :: MaybeT m a -> MaybeT m a -> Bool #

(<=) :: MaybeT m a -> MaybeT m a -> Bool #

(>) :: MaybeT m a -> MaybeT m a -> Bool #

(>=) :: MaybeT m a -> MaybeT m a -> Bool #

max :: MaybeT m a -> MaybeT m a -> MaybeT m a #

min :: MaybeT m a -> MaybeT m a -> MaybeT m a #

(Ord1 f, Ord a) => Ord (Cofree f a) 
Instance details

Defined in Control.Comonad.Cofree

Methods

compare :: Cofree f a -> Cofree f a -> Ordering #

(<) :: Cofree f a -> Cofree f a -> Bool #

(<=) :: Cofree f a -> Cofree f a -> Bool #

(>) :: Cofree f a -> Cofree f a -> Bool #

(>=) :: Cofree f a -> Cofree f a -> Bool #

max :: Cofree f a -> Cofree f a -> Cofree f a #

min :: Cofree f a -> Cofree f a -> Cofree f a #

(Ord1 f, Ord a) => Ord (Free f a) 
Instance details

Defined in Control.Monad.Free

Methods

compare :: Free f a -> Free f a -> Ordering #

(<) :: Free f a -> Free f a -> Bool #

(<=) :: Free f a -> Free f a -> Bool #

(>) :: Free f a -> Free f a -> Bool #

(>=) :: Free f a -> Free f a -> Bool #

max :: Free f a -> Free f a -> Free f a #

min :: Free f a -> Free f a -> Free f a #

(Ord1 f, Ord a) => Ord (Yoneda f a) 
Instance details

Defined in Data.Functor.Yoneda

Methods

compare :: Yoneda f a -> Yoneda f a -> Ordering #

(<) :: Yoneda f a -> Yoneda f a -> Bool #

(<=) :: Yoneda f a -> Yoneda f a -> Bool #

(>) :: Yoneda f a -> Yoneda f a -> Bool #

(>=) :: Yoneda f a -> Yoneda f a -> Bool #

max :: Yoneda f a -> Yoneda f a -> Yoneda f a #

min :: Yoneda f a -> Yoneda f a -> Yoneda f a #

(Ord n, Ord m) => Ord (ArithError n m) 
Instance details

Defined in Michelson.Typed.Arith

Methods

compare :: ArithError n m -> ArithError n m -> Ordering #

(<) :: ArithError n m -> ArithError n m -> Bool #

(<=) :: ArithError n m -> ArithError n m -> Bool #

(>) :: ArithError n m -> ArithError n m -> Bool #

(>=) :: ArithError n m -> ArithError n m -> Bool #

max :: ArithError n m -> ArithError n m -> ArithError n m #

min :: ArithError n m -> ArithError n m -> ArithError n m #

Comparable e => Ord (Value' instr e) 
Instance details

Defined in Michelson.Typed.Value

Methods

compare :: Value' instr e -> Value' instr e -> Ordering #

(<) :: Value' instr e -> Value' instr e -> Bool #

(<=) :: Value' instr e -> Value' instr e -> Bool #

(>) :: Value' instr e -> Value' instr e -> Bool #

(>=) :: Value' instr e -> Value' instr e -> Bool #

max :: Value' instr e -> Value' instr e -> Value' instr e #

min :: Value' instr e -> Value' instr e -> Value' instr e #

Class (Num a, Ord a) (Real a) 
Instance details

Defined in Data.Constraint

Methods

cls :: Real a :- (Num a, Ord a) #

(Ord a, Ord b) :=> (Ord (a, b)) 
Instance details

Defined in Data.Constraint

Methods

ins :: (Ord a, Ord b) :- Ord (a, b) #

(Ord a, Ord b) :=> (Ord (Either a b)) 
Instance details

Defined in Data.Constraint

Methods

ins :: (Ord a, Ord b) :- Ord (Either a b) #

Ord (f p) => Ord (Rec1 f p)

Since: base-4.7.0.0

Instance details

Defined in GHC.Generics

Methods

compare :: Rec1 f p -> Rec1 f p -> Ordering #

(<) :: Rec1 f p -> Rec1 f p -> Bool #

(<=) :: Rec1 f p -> Rec1 f p -> Bool #

(>) :: Rec1 f p -> Rec1 f p -> Bool #

(>=) :: Rec1 f p -> Rec1 f p -> Bool #

max :: Rec1 f p -> Rec1 f p -> Rec1 f p #

min :: Rec1 f p -> Rec1 f p -> Rec1 f p #

Ord (URec (Ptr ()) p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

compare :: URec (Ptr ()) p -> URec (Ptr ()) p -> Ordering #

(<) :: URec (Ptr ()) p -> URec (Ptr ()) p -> Bool #

(<=) :: URec (Ptr ()) p -> URec (Ptr ()) p -> Bool #

(>) :: URec (Ptr ()) p -> URec (Ptr ()) p -> Bool #

(>=) :: URec (Ptr ()) p -> URec (Ptr ()) p -> Bool #

max :: URec (Ptr ()) p -> URec (Ptr ()) p -> URec (Ptr ()) p #

min :: URec (Ptr ()) p -> URec (Ptr ()) p -> URec (Ptr ()) p #

Ord (URec Char p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

compare :: URec Char p -> URec Char p -> Ordering #

(<) :: URec Char p -> URec Char p -> Bool #

(<=) :: URec Char p -> URec Char p -> Bool #

(>) :: URec Char p -> URec Char p -> Bool #

(>=) :: URec Char p -> URec Char p -> Bool #

max :: URec Char p -> URec Char p -> URec Char p #

min :: URec Char p -> URec Char p -> URec Char p #

Ord (URec Double p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

compare :: URec Double p -> URec Double p -> Ordering #

(<) :: URec Double p -> URec Double p -> Bool #

(<=) :: URec Double p -> URec Double p -> Bool #

(>) :: URec Double p -> URec Double p -> Bool #

(>=) :: URec Double p -> URec Double p -> Bool #

max :: URec Double p -> URec Double p -> URec Double p #

min :: URec Double p -> URec Double p -> URec Double p #

Ord (URec Float p) 
Instance details

Defined in GHC.Generics

Methods

compare :: URec Float p -> URec Float p -> Ordering #

(<) :: URec Float p -> URec Float p -> Bool #

(<=) :: URec Float p -> URec Float p -> Bool #

(>) :: URec Float p -> URec Float p -> Bool #

(>=) :: URec Float p -> URec Float p -> Bool #

max :: URec Float p -> URec Float p -> URec Float p #

min :: URec Float p -> URec Float p -> URec Float p #

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 #

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 #

(Ord a, Ord b, Ord c) => Ord (a, b, c) 
Instance details

Defined in GHC.Classes

Methods

compare :: (a, b, c) -> (a, b, c) -> Ordering #

(<) :: (a, b, c) -> (a, b, c) -> Bool #

(<=) :: (a, b, c) -> (a, b, c) -> Bool #

(>) :: (a, b, c) -> (a, b, c) -> Bool #

(>=) :: (a, b, c) -> (a, b, c) -> Bool #

max :: (a, b, c) -> (a, b, c) -> (a, b, c) #

min :: (a, b, c) -> (a, b, c) -> (a, b, c) #

Ord a => Ord (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Methods

compare :: Const a b -> Const a b -> Ordering #

(<) :: Const a b -> Const a b -> Bool #

(<=) :: Const a b -> Const a b -> Bool #

(>) :: Const a b -> Const a b -> Bool #

(>=) :: Const a b -> Const a b -> Bool #

max :: Const a b -> Const a b -> Const a b #

min :: Const a b -> Const a b -> Const a b #

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 #

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 #

Ord (Coercion a b)

Since: base-4.7.0.0

Instance details

Defined in Data.Type.Coercion

Methods

compare :: Coercion a b -> Coercion a b -> Ordering #

(<) :: Coercion a b -> Coercion a b -> Bool #

(<=) :: Coercion a b -> Coercion a b -> Bool #

(>) :: Coercion a b -> Coercion a b -> Bool #

(>=) :: Coercion a b -> Coercion a b -> Bool #

max :: Coercion a b -> Coercion a b -> Coercion a b #

min :: Coercion a b -> Coercion a b -> Coercion a b #

Ord (a :~: b)

Since: base-4.7.0.0

Instance details

Defined in Data.Type.Equality

Methods

compare :: (a :~: b) -> (a :~: b) -> Ordering #

(<) :: (a :~: b) -> (a :~: b) -> Bool #

(<=) :: (a :~: b) -> (a :~: b) -> Bool #

(>) :: (a :~: b) -> (a :~: b) -> Bool #

(>=) :: (a :~: b) -> (a :~: b) -> Bool #

max :: (a :~: b) -> (a :~: b) -> a :~: b #

min :: (a :~: b) -> (a :~: b) -> a :~: b #

Ord (p a a) => Ord (Join p a) 
Instance details

Defined in Data.Bifunctor.Join

Methods

compare :: Join p a -> Join p a -> Ordering #

(<) :: Join p a -> Join p a -> Bool #

(<=) :: Join p a -> Join p a -> Bool #

(>) :: Join p a -> Join p a -> Bool #

(>=) :: Join p a -> Join p a -> Bool #

max :: Join p a -> Join p a -> Join p a #

min :: Join p a -> Join p a -> Join p a #

Ord (p (Fix p a) a) => Ord (Fix p a) 
Instance details

Defined in Data.Bifunctor.Fix

Methods

compare :: Fix p a -> Fix p a -> Ordering #

(<) :: Fix p a -> Fix p a -> Bool #

(<=) :: Fix p a -> Fix p a -> Bool #

(>) :: Fix p a -> Fix p a -> Bool #

(>=) :: Fix p a -> Fix p a -> Bool #

max :: Fix p a -> Fix p a -> Fix p a #

min :: Fix p a -> Fix p a -> Fix p a #

(Ord1 f, Ord a) => Ord (IdentityT f a) 
Instance details

Defined in Control.Monad.Trans.Identity

Methods

compare :: IdentityT f a -> IdentityT f a -> Ordering #

(<) :: IdentityT f a -> IdentityT f a -> Bool #

(<=) :: IdentityT f a -> IdentityT f a -> Bool #

(>) :: IdentityT f a -> IdentityT f a -> Bool #

(>=) :: IdentityT f a -> IdentityT f a -> Bool #

max :: IdentityT f a -> IdentityT f a -> IdentityT f a #

min :: IdentityT f a -> IdentityT f a -> IdentityT f a #

(Ord e, Ord1 m, Ord a) => Ord (ExceptT e m a) 
Instance details

Defined in Control.Monad.Trans.Except

Methods

compare :: ExceptT e m a -> ExceptT e m a -> Ordering #

(<) :: ExceptT e m a -> ExceptT e m a -> Bool #

(<=) :: ExceptT e m a -> ExceptT e m a -> Bool #

(>) :: ExceptT e m a -> ExceptT e m a -> Bool #

(>=) :: ExceptT e m a -> ExceptT e m a -> Bool #

max :: ExceptT e m a -> ExceptT e m a -> ExceptT e m a #

min :: ExceptT e m a -> ExceptT e m a -> ExceptT e m a #

(Ord a, Ord (f b)) => Ord (FreeF f a b) 
Instance details

Defined in Control.Monad.Trans.Free

Methods

compare :: FreeF f a b -> FreeF f a b -> Ordering #

(<) :: FreeF f a b -> FreeF f a b -> Bool #

(<=) :: FreeF f a b -> FreeF f a b -> Bool #

(>) :: FreeF f a b -> FreeF f a b -> Bool #

(>=) :: FreeF f a b -> FreeF f a b -> Bool #

max :: FreeF f a b -> FreeF f a b -> FreeF f a b #

min :: FreeF f a b -> FreeF f a b -> FreeF f a b #

(Ord1 f, Ord1 m, Ord a) => Ord (FreeT f m a) 
Instance details

Defined in Control.Monad.Trans.Free

Methods

compare :: FreeT f m a -> FreeT f m a -> Ordering #

(<) :: FreeT f m a -> FreeT f m a -> Bool #

(<=) :: FreeT f m a -> FreeT f m a -> Bool #

(>) :: FreeT f m a -> FreeT f m a -> Bool #

(>=) :: FreeT f m a -> FreeT f m a -> Bool #

max :: FreeT f m a -> FreeT f m a -> FreeT f m a #

min :: FreeT f m a -> FreeT f m a -> FreeT f m a #

(Ord a, Ord (f b)) => Ord (CofreeF f a b) 
Instance details

Defined in Control.Comonad.Trans.Cofree

Methods

compare :: CofreeF f a b -> CofreeF f a b -> Ordering #

(<) :: CofreeF f a b -> CofreeF f a b -> Bool #

(<=) :: CofreeF f a b -> CofreeF f a b -> Bool #

(>) :: CofreeF f a b -> CofreeF f a b -> Bool #

(>=) :: CofreeF f a b -> CofreeF f a b -> Bool #

max :: CofreeF f a b -> CofreeF f a b -> CofreeF f a b #

min :: CofreeF f a b -> CofreeF f a b -> CofreeF f a b #

Ord (w (CofreeF f a (CofreeT f w a))) => Ord (CofreeT f w a) 
Instance details

Defined in Control.Comonad.Trans.Cofree

Methods

compare :: CofreeT f w a -> CofreeT f w a -> Ordering #

(<) :: CofreeT f w a -> CofreeT f w a -> Bool #

(<=) :: CofreeT f w a -> CofreeT f w a -> Bool #

(>) :: CofreeT f w a -> CofreeT f w a -> Bool #

(>=) :: CofreeT f w a -> CofreeT f w a -> Bool #

max :: CofreeT f w a -> CofreeT f w a -> CofreeT f w a #

min :: CofreeT f w a -> CofreeT f w a -> CofreeT f w a #

(Ord e, Ord1 m, Ord a) => Ord (ErrorT e m a) 
Instance details

Defined in Control.Monad.Trans.Error

Methods

compare :: ErrorT e m a -> ErrorT e m a -> Ordering #

(<) :: ErrorT e m a -> ErrorT e m a -> Bool #

(<=) :: ErrorT e m a -> ErrorT e m a -> Bool #

(>) :: ErrorT e m a -> ErrorT e m a -> Bool #

(>=) :: ErrorT e m a -> ErrorT e m a -> Bool #

max :: ErrorT e m a -> ErrorT e m a -> ErrorT e m a #

min :: ErrorT e m a -> ErrorT e m a -> ErrorT e m a #

Ord (Rec f ('[] :: [u])) 
Instance details

Defined in Data.Vinyl.Core

Methods

compare :: Rec f '[] -> Rec f '[] -> Ordering #

(<) :: Rec f '[] -> Rec f '[] -> Bool #

(<=) :: Rec f '[] -> Rec f '[] -> Bool #

(>) :: Rec f '[] -> Rec f '[] -> Bool #

(>=) :: Rec f '[] -> Rec f '[] -> Bool #

max :: Rec f '[] -> Rec f '[] -> Rec f '[] #

min :: Rec f '[] -> Rec f '[] -> Rec f '[] #

(Ord (f r), Ord (Rec f rs)) => Ord (Rec f (r ': rs)) 
Instance details

Defined in Data.Vinyl.Core

Methods

compare :: Rec f (r ': rs) -> Rec f (r ': rs) -> Ordering #

(<) :: Rec f (r ': rs) -> Rec f (r ': rs) -> Bool #

(<=) :: Rec f (r ': rs) -> Rec f (r ': rs) -> Bool #

(>) :: Rec f (r ': rs) -> Rec f (r ': rs) -> Bool #

(>=) :: Rec f (r ': rs) -> Rec f (r ': rs) -> Bool #

max :: Rec f (r ': rs) -> Rec f (r ': rs) -> Rec f (r ': rs) #

min :: Rec f (r ': rs) -> Rec f (r ': rs) -> Rec f (r ': rs) #

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 #

(RPureConstrained (IndexableField rs) rs, RecApplicative rs, Ord (Rec f rs)) => Ord (ARec f rs) 
Instance details

Defined in Data.Vinyl.ARec

Methods

compare :: ARec f rs -> ARec f rs -> Ordering #

(<) :: ARec f rs -> ARec f rs -> Bool #

(<=) :: ARec f rs -> ARec f rs -> Bool #

(>) :: ARec f rs -> ARec f rs -> Bool #

(>=) :: ARec f rs -> ARec f rs -> Bool #

max :: ARec f rs -> ARec f rs -> ARec f rs #

min :: ARec f rs -> ARec f rs -> ARec f rs #

Ord c => Ord (K1 i c p)

Since: base-4.7.0.0

Instance details

Defined in GHC.Generics

Methods

compare :: K1 i c p -> K1 i c p -> Ordering #

(<) :: K1 i c p -> K1 i c p -> Bool #

(<=) :: K1 i c p -> K1 i c p -> Bool #

(>) :: K1 i c p -> K1 i c p -> Bool #

(>=) :: K1 i c p -> K1 i c p -> Bool #

max :: K1 i c p -> K1 i c p -> K1 i c p #

min :: K1 i c p -> K1 i c p -> K1 i c p #

(Ord (f p), Ord (g p)) => Ord ((f :+: g) p)

Since: base-4.7.0.0

Instance details

Defined in GHC.Generics

Methods

compare :: (f :+: g) p -> (f :+: g) p -> Ordering #

(<) :: (f :+: g) p -> (f :+: g) p -> Bool #

(<=) :: (f :+: g) p -> (f :+: g) p -> Bool #

(>) :: (f :+: g) p -> (f :+: g) p -> Bool #

(>=) :: (f :+: g) p -> (f :+: g) p -> Bool #

max :: (f :+: g) p -> (f :+: g) p -> (f :+: g) p #

min :: (f :+: g) p -> (f :+: g) p -> (f :+: g) p #

(Ord (f p), Ord (g p)) => Ord ((f :*: g) p)

Since: base-4.7.0.0

Instance details

Defined in GHC.Generics

Methods

compare :: (f :*: g) p -> (f :*: g) p -> Ordering #

(<) :: (f :*: g) p -> (f :*: g) p -> Bool #

(<=) :: (f :*: g) p -> (f :*: g) p -> Bool #

(>) :: (f :*: g) p -> (f :*: g) p -> Bool #

(>=) :: (f :*: g) p -> (f :*: g) p -> Bool #

max :: (f :*: g) p -> (f :*: g) p -> (f :*: g) p #

min :: (f :*: g) p -> (f :*: g) p -> (f :*: g) p #

(Ord a, Ord b, Ord c, Ord d) => Ord (a, b, c, d) 
Instance details

Defined in GHC.Classes

Methods

compare :: (a, b, c, d) -> (a, b, c, d) -> Ordering #

(<) :: (a, b, c, d) -> (a, b, c, d) -> Bool #

(<=) :: (a, b, c, d) -> (a, b, c, d) -> Bool #

(>) :: (a, b, c, d) -> (a, b, c, d) -> Bool #

(>=) :: (a, b, c, d) -> (a, b, c, d) -> Bool #

max :: (a, b, c, d) -> (a, b, c, d) -> (a, b, c, d) #

min :: (a, b, c, d) -> (a, b, c, d) -> (a, b, c, d) #

(Ord1 f, Ord1 g, Ord a) => Ord (Product f g a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Product

Methods

compare :: Product f g a -> Product f g a -> Ordering #

(<) :: Product f g a -> Product f g a -> Bool #

(<=) :: Product f g a -> Product f g a -> Bool #

(>) :: Product f g a -> Product f g a -> Bool #

(>=) :: Product f g a -> Product f g a -> Bool #

max :: Product f g a -> Product f g a -> Product f g a #

min :: Product f g a -> Product f g a -> Product f g a #

(Ord1 f, Ord1 g, Ord a) => Ord (Sum f g a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Sum

Methods

compare :: Sum f g a -> Sum f g a -> Ordering #

(<) :: Sum f g a -> Sum f g a -> Bool #

(<=) :: Sum f g a -> Sum f g a -> Bool #

(>) :: Sum f g a -> Sum f g a -> Bool #

(>=) :: Sum f g a -> Sum f g a -> Bool #

max :: Sum f g a -> Sum f g a -> Sum f g a #

min :: Sum f g a -> Sum f g a -> Sum f g a #

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 #

Ord (f p) => Ord (M1 i c f p)

Since: base-4.7.0.0

Instance details

Defined in GHC.Generics

Methods

compare :: M1 i c f p -> M1 i c f p -> Ordering #

(<) :: M1 i c f p -> M1 i c f p -> Bool #

(<=) :: M1 i c f p -> M1 i c f p -> Bool #

(>) :: M1 i c f p -> M1 i c f p -> Bool #

(>=) :: M1 i c f p -> M1 i c f p -> Bool #

max :: M1 i c f p -> M1 i c f p -> M1 i c f p #

min :: M1 i c f p -> M1 i c f p -> M1 i c f p #

Ord (f (g p)) => Ord ((f :.: g) p)

Since: base-4.7.0.0

Instance details

Defined in GHC.Generics

Methods

compare :: (f :.: g) p -> (f :.: g) p -> Ordering #

(<) :: (f :.: g) p -> (f :.: g) p -> Bool #

(<=) :: (f :.: g) p -> (f :.: g) p -> Bool #

(>) :: (f :.: g) p -> (f :.: g) p -> Bool #

(>=) :: (f :.: g) p -> (f :.: g) p -> Bool #

max :: (f :.: g) p -> (f :.: g) p -> (f :.: g) p #

min :: (f :.: g) p -> (f :.: g) p -> (f :.: g) p #

(Ord a, Ord b, Ord c, Ord d, Ord e) => Ord (a, b, c, d, e) 
Instance details

Defined in GHC.Classes

Methods

compare :: (a, b, c, d, e) -> (a, b, c, d, e) -> Ordering #

(<) :: (a, b, c, d, e) -> (a, b, c, d, e) -> Bool #

(<=) :: (a, b, c, d, e) -> (a, b, c, d, e) -> Bool #

(>) :: (a, b, c, d, e) -> (a, b, c, d, e) -> Bool #

(>=) :: (a, b, c, d, e) -> (a, b, c, d, e) -> Bool #

max :: (a, b, c, d, e) -> (a, b, c, d, e) -> (a, b, c, d, e) #

min :: (a, b, c, d, e) -> (a, b, c, d, e) -> (a, b, c, d, e) #

(Ord1 f, Ord1 g, Ord a) => Ord (Compose f g a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Compose

Methods

compare :: Compose f g a -> Compose f g a -> Ordering #

(<) :: Compose f g a -> Compose f g a -> Bool #

(<=) :: Compose f g a -> Compose f g a -> Bool #

(>) :: Compose f g a -> Compose f g a -> Bool #

(>=) :: Compose f g a -> Compose f g a -> Bool #

max :: Compose f g a -> Compose f g a -> Compose f g a #

min :: Compose f g a -> Compose f g a -> Compose f g a #

Ord (p a b) => Ord (WrappedBifunctor p a b) 
Instance details

Defined in Data.Bifunctor.Wrapped

Ord (g b) => Ord (Joker g a b) 
Instance details

Defined in Data.Bifunctor.Joker

Methods

compare :: Joker g a b -> Joker g a b -> Ordering #

(<) :: Joker g a b -> Joker g a b -> Bool #

(<=) :: Joker g a b -> Joker g a b -> Bool #

(>) :: Joker g a b -> Joker g a b -> Bool #

(>=) :: Joker g a b -> Joker g a b -> Bool #

max :: Joker g a b -> Joker g a b -> Joker g a b #

min :: Joker g a b -> Joker g a b -> Joker g a b #

Ord (p b a) => Ord (Flip p a b) 
Instance details

Defined in Data.Bifunctor.Flip

Methods

compare :: Flip p a b -> Flip p a b -> Ordering #

(<) :: Flip p a b -> Flip p a b -> Bool #

(<=) :: Flip p a b -> Flip p a b -> Bool #

(>) :: Flip p a b -> Flip p a b -> Bool #

(>=) :: Flip p a b -> Flip p a b -> Bool #

max :: Flip p a b -> Flip p a b -> Flip p a b #

min :: Flip p a b -> Flip p a b -> Flip p a b #

Ord (f a) => Ord (Clown f a b) 
Instance details

Defined in Data.Bifunctor.Clown

Methods

compare :: Clown f a b -> Clown f a b -> Ordering #

(<) :: Clown f a b -> Clown f a b -> Bool #

(<=) :: Clown f a b -> Clown f a b -> Bool #

(>) :: Clown f a b -> Clown f a b -> Bool #

(>=) :: Clown f a b -> Clown f a b -> Bool #

max :: Clown f a b -> Clown f a b -> Clown f a b #

min :: Clown f a b -> Clown f a b -> Clown f a b #

(Ord a, Ord b, Ord c, Ord d, Ord e, Ord f) => Ord (a, b, c, d, e, f) 
Instance details

Defined in GHC.Classes

Methods

compare :: (a, b, c, d, e, f) -> (a, b, c, d, e, f) -> Ordering #

(<) :: (a, b, c, d, e, f) -> (a, b, c, d, e, f) -> Bool #

(<=) :: (a, b, c, d, e, f) -> (a, b, c, d, e, f) -> Bool #

(>) :: (a, b, c, d, e, f) -> (a, b, c, d, e, f) -> Bool #

(>=) :: (a, b, c, d, e, f) -> (a, b, c, d, e, f) -> Bool #

max :: (a, b, c, d, e, f) -> (a, b, c, d, e, f) -> (a, b, c, d, e, f) #

min :: (a, b, c, d, e, f) -> (a, b, c, d, e, f) -> (a, b, c, d, e, f) #

(Ord (p a b), Ord (q a b)) => Ord (Sum p q a b) 
Instance details

Defined in Data.Bifunctor.Sum

Methods

compare :: Sum p q a b -> Sum p q a b -> Ordering #

(<) :: Sum p q a b -> Sum p q a b -> Bool #

(<=) :: Sum p q a b -> Sum p q a b -> Bool #

(>) :: Sum p q a b -> Sum p q a b -> Bool #

(>=) :: Sum p q a b -> Sum p q a b -> Bool #

max :: Sum p q a b -> Sum p q a b -> Sum p q a b #

min :: Sum p q a b -> Sum p q a b -> Sum p q a b #

(Ord (f a b), Ord (g a b)) => Ord (Product f g a b) 
Instance details

Defined in Data.Bifunctor.Product

Methods

compare :: Product f g a b -> Product f g a b -> Ordering #

(<) :: Product f g a b -> Product f g a b -> Bool #

(<=) :: Product f g a b -> Product f g a b -> Bool #

(>) :: Product f g a b -> Product f g a b -> Bool #

(>=) :: Product f g a b -> Product f g a b -> Bool #

max :: Product f g a b -> Product f g a b -> Product f g a b #

min :: Product f g a b -> Product f g a b -> Product f g a b #

(Ord a, Ord b, Ord c, Ord d, Ord e, Ord f, Ord g) => Ord (a, b, c, d, e, f, g) 
Instance details

Defined in GHC.Classes

Methods

compare :: (a, b, c, d, e, f, g) -> (a, b, c, d, e, f, g) -> Ordering #

(<) :: (a, b, c, d, e, f, g) -> (a, b, c, d, e, f, g) -> Bool #

(<=) :: (a, b, c, d, e, f, g) -> (a, b, c, d, e, f, g) -> Bool #

(>) :: (a, b, c, d, e, f, g) -> (a, b, c, d, e, f, g) -> Bool #

(>=) :: (a, b, c, d, e, f, g) -> (a, b, c, d, e, f, g) -> Bool #

max :: (a, b, c, d, e, f, g) -> (a, b, c, d, e, f, g) -> (a, b, c, d, e, f, g) #

min :: (a, b, c, d, e, f, g) -> (a, b, c, d, e, f, g) -> (a, b, c, d, e, f, g) #

Ord (f (p a b)) => Ord (Tannen f p a b) 
Instance details

Defined in Data.Bifunctor.Tannen

Methods

compare :: Tannen f p a b -> Tannen f p a b -> Ordering #

(<) :: Tannen f p a b -> Tannen f p a b -> Bool #

(<=) :: Tannen f p a b -> Tannen f p a b -> Bool #

(>) :: Tannen f p a b -> Tannen f p a b -> Bool #

(>=) :: Tannen f p a b -> Tannen f p a b -> Bool #

max :: Tannen f p a b -> Tannen f p a b -> Tannen f p a b #

min :: Tannen f p a b -> Tannen f p a b -> Tannen f p a b #

(Ord a, Ord b, Ord c, Ord d, Ord e, Ord f, Ord g, Ord h) => Ord (a, b, c, d, e, f, g, h) 
Instance details

Defined in GHC.Classes

Methods

compare :: (a, b, c, d, e, f, g, h) -> (a, b, c, d, e, f, g, h) -> Ordering #

(<) :: (a, b, c, d, e, f, g, h) -> (a, b, c, d, e, f, g, h) -> Bool #

(<=) :: (a, b, c, d, e, f, g, h) -> (a, b, c, d, e, f, g, h) -> Bool #

(>) :: (a, b, c, d, e, f, g, h) -> (a, b, c, d, e, f, g, h) -> Bool #

(>=) :: (a, b, c, d, e, f, g, h) -> (a, b, c, d, e, f, g, h) -> Bool #

max :: (a, b, c, d, e, f, g, h) -> (a, b, c, d, e, f, g, h) -> (a, b, c, d, e, f, g, h) #

min :: (a, b, c, d, e, f, g, h) -> (a, b, c, d, e, f, g, h) -> (a, b, c, d, e, f, g, h) #

(Ord a, Ord b, Ord c, Ord d, Ord e, Ord f, Ord g, Ord h, Ord i) => Ord (a, b, c, d, e, f, g, h, i) 
Instance details

Defined in GHC.Classes

Methods

compare :: (a, b, c, d, e, f, g, h, i) -> (a, b, c, d, e, f, g, h, i) -> Ordering #

(<) :: (a, b, c, d, e, f, g, h, i) -> (a, b, c, d, e, f, g, h, i) -> Bool #

(<=) :: (a, b, c, d, e, f, g, h, i) -> (a, b, c, d, e, f, g, h, i) -> Bool #

(>) :: (a, b, c, d, e, f, g, h, i) -> (a, b, c, d, e, f, g, h, i) -> Bool #

(>=) :: (a, b, c, d, e, f, g, h, i) -> (a, b, c, d, e, f, g, h, i) -> Bool #

max :: (a, b, c, d, e, f, g, h, i) -> (a, b, c, d, e, f, g, h, i) -> (a, b, c, d, e, f, g, h, i) #

min :: (a, b, c, d, e, f, g, h, i) -> (a, b, c, d, e, f, g, h, i) -> (a, b, c, d, e, f, g, h, i) #

Ord (p (f a) (g b)) => Ord (Biff p f g a b) 
Instance details

Defined in Data.Bifunctor.Biff

Methods

compare :: Biff p f g a b -> Biff p f g a b -> Ordering #

(<) :: Biff p f g a b -> Biff p f g a b -> Bool #

(<=) :: Biff p f g a b -> Biff p f g a b -> Bool #

(>) :: Biff p f g a b -> Biff p f g a b -> Bool #

(>=) :: Biff p f g a b -> Biff p f g a b -> Bool #

max :: Biff p f g a b -> Biff p f g a b -> Biff p f g a b #

min :: Biff p f g a b -> Biff p f g a b -> Biff p f g a b #

(Ord a, Ord b, Ord c, Ord d, Ord e, Ord f, Ord g, Ord h, Ord i, Ord j) => Ord (a, b, c, d, e, f, g, h, i, j) 
Instance details

Defined in GHC.Classes

Methods

compare :: (a, b, c, d, e, f, g, h, i, j) -> (a, b, c, d, e, f, g, h, i, j) -> Ordering #

(<) :: (a, b, c, d, e, f, g, h, i, j) -> (a, b, c, d, e, f, g, h, i, j) -> Bool #

(<=) :: (a, b, c, d, e, f, g, h, i, j) -> (a, b, c, d, e, f, g, h, i, j) -> Bool #

(>) :: (a, b, c, d, e, f, g, h, i, j) -> (a, b, c, d, e, f, g, h, i, j) -> Bool #

(>=) :: (a, b, c, d, e, f, g, h, i, j) -> (a, b, c, d, e, f, g, h, i, j) -> Bool #

max :: (a, b, c, d, e, f, g, h, i, j) -> (a, b, c, d, e, f, g, h, i, j) -> (a, b, c, d, e, f, g, h, i, j) #

min :: (a, b, c, d, e, f, g, h, i, j) -> (a, b, c, d, e, f, g, h, i, j) -> (a, b, c, d, e, f, g, h, i, j) #

(Ord a, Ord b, Ord c, Ord d, Ord e, Ord f, Ord g, Ord h, Ord i, Ord j, Ord k) => Ord (a, b, c, d, e, f, g, h, i, j, k) 
Instance details

Defined in GHC.Classes

Methods

compare :: (a, b, c, d, e, f, g, h, i, j, k) -> (a, b, c, d, e, f, g, h, i, j, k) -> Ordering #

(<) :: (a, b, c, d, e, f, g, h, i, j, k) -> (a, b, c, d, e, f, g, h, i, j, k) -> Bool #

(<=) :: (a, b, c, d, e, f, g, h, i, j, k) -> (a, b, c, d, e, f, g, h, i, j, k) -> Bool #

(>) :: (a, b, c, d, e, f, g, h, i, j, k) -> (a, b, c, d, e, f, g, h, i, j, k) -> Bool #

(>=) :: (a, b, c, d, e, f, g, h, i, j, k) -> (a, b, c, d, e, f, g, h, i, j, k) -> Bool #

max :: (a, b, c, d, e, f, g, h, i, j, k) -> (a, b, c, d, e, f, g, h, i, j, k) -> (a, b, c, d, e, f, g, h, i, j, k) #

min :: (a, b, c, d, e, f, g, h, i, j, k) -> (a, b, c, d, e, f, g, h, i, j, k) -> (a, b, c, d, e, f, g, h, i, j, k) #

(Ord a, Ord b, Ord c, Ord d, Ord e, Ord f, Ord g, Ord h, Ord i, Ord j, Ord k, Ord l) => Ord (a, b, c, d, e, f, g, h, i, j, k, l) 
Instance details

Defined in GHC.Classes

Methods

compare :: (a, b, c, d, e, f, g, h, i, j, k, l) -> (a, b, c, d, e, f, g, h, i, j, k, l) -> Ordering #

(<) :: (a, b, c, d, e, f, g, h, i, j, k, l) -> (a, b, c, d, e, f, g, h, i, j, k, l) -> Bool #

(<=) :: (a, b, c, d, e, f, g, h, i, j, k, l) -> (a, b, c, d, e, f, g, h, i, j, k, l) -> Bool #

(>) :: (a, b, c, d, e, f, g, h, i, j, k, l) -> (a, b, c, d, e, f, g, h, i, j, k, l) -> Bool #

(>=) :: (a, b, c, d, e, f, g, h, i, j, k, l) -> (a, b, c, d, e, f, g, h, i, j, k, l) -> Bool #

max :: (a, b, c, d, e, f, g, h, i, j, k, l) -> (a, b, c, d, e, f, g, h, i, j, k, l) -> (a, b, c, d, e, f, g, h, i, j, k, l) #

min :: (a, b, c, d, e, f, g, h, i, j, k, l) -> (a, b, c, d, e, f, g, h, i, j, k, l) -> (a, b, c, d, e, f, g, h, i, j, k, l) #

(Ord a, Ord b, Ord c, Ord d, Ord e, Ord f, Ord g, Ord h, Ord i, Ord j, Ord k, Ord l, Ord m) => Ord (a, b, c, d, e, f, g, h, i, j, k, l, m) 
Instance details

Defined in GHC.Classes

Methods

compare :: (a, b, c, d, e, f, g, h, i, j, k, l, m) -> (a, b, c, d, e, f, g, h, i, j, k, l, m) -> Ordering #

(<) :: (a, b, c, d, e, f, g, h, i, j, k, l, m) -> (a, b, c, d, e, f, g, h, i, j, k, l, m) -> Bool #

(<=) :: (a, b, c, d, e, f, g, h, i, j, k, l, m) -> (a, b, c, d, e, f, g, h, i, j, k, l, m) -> Bool #

(>) :: (a, b, c, d, e, f, g, h, i, j, k, l, m) -> (a, b, c, d, e, f, g, h, i, j, k, l, m) -> Bool #

(>=) :: (a, b, c, d, e, f, g, h, i, j, k, l, m) -> (a, b, c, d, e, f, g, h, i, j, k, l, m) -> Bool #

max :: (a, b, c, d, e, f, g, h, i, j, k, l, m) -> (a, b, c, d, e, f, g, h, i, j, k, l, m) -> (a, b, c, d, e, f, g, h, i, j, k, l, m) #

min :: (a, b, c, d, e, f, g, h, i, j, k, l, m) -> (a, b, c, d, e, f, g, h, i, j, k, l, m) -> (a, b, c, d, e, f, g, h, i, j, k, l, m) #

(Ord a, Ord b, Ord c, Ord d, Ord e, Ord f, Ord g, Ord h, Ord i, Ord j, Ord k, Ord l, Ord m, Ord n) => Ord (a, b, c, d, e, f, g, h, i, j, k, l, m, n) 
Instance details

Defined in GHC.Classes

Methods

compare :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n) -> Ordering #

(<) :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n) -> Bool #

(<=) :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n) -> Bool #

(>) :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n) -> Bool #

(>=) :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n) -> Bool #

max :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n) #

min :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n) #

(Ord a, Ord b, Ord c, Ord d, Ord e, Ord f, Ord g, Ord h, Ord i, Ord j, Ord k, Ord l, Ord m, Ord n, Ord o) => Ord (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) 
Instance details

Defined in GHC.Classes

Methods

compare :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) -> Ordering #

(<) :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) -> Bool #

(<=) :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) -> Bool #

(>) :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) -> Bool #

(>=) :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) -> Bool #

max :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) #

min :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) #

class Read a #

Parsing of Strings, producing values.

Derived instances of Read make the following assumptions, which derived instances of Show obey:

  • If the constructor is defined to be an infix operator, then the derived Read instance will parse only infix applications of the constructor (not the prefix form).
  • Associativity is not used to reduce the occurrence of parentheses, although precedence may be.
  • If the constructor is defined using record syntax, the derived Read will parse only the record-syntax form, and furthermore, the fields must be given in the same order as the original declaration.
  • The derived Read instance allows arbitrary Haskell whitespace between tokens of the input string. Extra parentheses are also allowed.

For example, given the declarations

infixr 5 :^:
data Tree a =  Leaf a  |  Tree a :^: Tree a

the derived instance of Read in Haskell 2010 is equivalent to

instance (Read a) => Read (Tree a) where

        readsPrec d r =  readParen (d > app_prec)
                         (\r -> [(Leaf m,t) |
                                 ("Leaf",s) <- lex r,
                                 (m,t) <- readsPrec (app_prec+1) s]) r

                      ++ readParen (d > up_prec)
                         (\r -> [(u:^:v,w) |
                                 (u,s) <- readsPrec (up_prec+1) r,
                                 (":^:",t) <- lex s,
                                 (v,w) <- readsPrec (up_prec+1) t]) r

          where app_prec = 10
                up_prec = 5

Note that right-associativity of :^: is unused.

The derived instance in GHC is equivalent to

instance (Read a) => Read (Tree a) where

        readPrec = parens $ (prec app_prec $ do
                                 Ident "Leaf" <- lexP
                                 m <- step readPrec
                                 return (Leaf m))

                     +++ (prec up_prec $ do
                                 u <- step readPrec
                                 Symbol ":^:" <- lexP
                                 v <- step readPrec
                                 return (u :^: v))

          where app_prec = 10
                up_prec = 5

        readListPrec = readListPrecDefault

Why do both readsPrec and readPrec exist, and why does GHC opt to implement readPrec in derived Read instances instead of readsPrec? The reason is that readsPrec is based on the ReadS type, and although ReadS is mentioned in the Haskell 2010 Report, it is not a very efficient parser data structure.

readPrec, on the other hand, is based on a much more efficient ReadPrec datatype (a.k.a "new-style parsers"), but its definition relies on the use of the RankNTypes language extension. Therefore, readPrec (and its cousin, readListPrec) are marked as GHC-only. Nevertheless, it is recommended to use readPrec instead of readsPrec whenever possible for the efficiency improvements it brings.

As mentioned above, derived Read instances in GHC will implement readPrec instead of readsPrec. The default implementations of readsPrec (and its cousin, readList) will simply use readPrec under the hood. If you are writing a Read instance by hand, it is recommended to write it like so:

instance Read T where
  readPrec     = ...
  readListPrec = readListPrecDefault

Minimal complete definition

readsPrec | readPrec

Instances

Instances details
Read Bool

Since: base-2.1

Instance details

Defined in GHC.Read

Read Char

Since: base-2.1

Instance details

Defined in GHC.Read

Read Double

Since: base-2.1

Instance details

Defined in GHC.Read

Read Float

Since: base-2.1

Instance details

Defined in GHC.Read

Read Int

Since: base-2.1

Instance details

Defined in GHC.Read

Read Int8

Since: base-2.1

Instance details

Defined in GHC.Int

Read Int16

Since: base-2.1

Instance details

Defined in GHC.Int

Read Int32

Since: base-2.1

Instance details

Defined in GHC.Int

Read Int64

Since: base-2.1

Instance details

Defined in GHC.Int

Read Integer

Since: base-2.1

Instance details

Defined in GHC.Read

Read Natural

Since: base-4.8.0.0

Instance details

Defined in GHC.Read

Read Ordering

Since: base-2.1

Instance details

Defined in GHC.Read

Read Word

Since: base-4.5.0.0

Instance details

Defined in GHC.Read

Read Word8

Since: base-2.1

Instance details

Defined in GHC.Read

Read Word16

Since: base-2.1

Instance details

Defined in GHC.Read

Read Word32

Since: base-2.1

Instance details

Defined in GHC.Read

Read Word64

Since: base-2.1

Instance details

Defined in GHC.Read

Read ()

Since: base-2.1

Instance details

Defined in GHC.Read

Methods

readsPrec :: Int -> ReadS () #

readList :: ReadS [()] #

readPrec :: ReadPrec () #

readListPrec :: ReadPrec [()] #

Read Version

Since: base-2.1

Instance details

Defined in Data.Version

Read ByteString 
Instance details

Defined in Data.ByteString.Internal

Read ByteString 
Instance details

Defined in Data.ByteString.Lazy.Internal

Read Scientific

Supports the skipping of parentheses and whitespaces. Example:

> read " ( ((  -1.0e+3 ) ))" :: Scientific
-1000.0

(Note: This Read instance makes internal use of scientificP to parse the floating-point number.)

Instance details

Defined in Data.Scientific

Read Value 
Instance details

Defined in Data.Aeson.Types.Internal

Read DotNetTime 
Instance details

Defined in Data.Aeson.Types.Internal

Read Void

Reading a Void value is always a parse error, considering Void as a data type with no constructors.

Since: base-4.8.0.0

Instance details

Defined in Data.Void

Read ExitCode 
Instance details

Defined in GHC.IO.Exception

Read BufferMode

Since: base-4.2.0.0

Instance details

Defined in GHC.IO.Handle.Types

Read Newline

Since: base-4.3.0.0

Instance details

Defined in GHC.IO.Handle.Types

Read NewlineMode

Since: base-4.3.0.0

Instance details

Defined in GHC.IO.Handle.Types

Read All

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Read Any

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Read Fixity

Since: base-4.6.0.0

Instance details

Defined in GHC.Generics

Read Associativity

Since: base-4.6.0.0

Instance details

Defined in GHC.Generics

Read SourceUnpackedness

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Read SourceStrictness

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Read DecidedStrictness

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Read SomeSymbol

Since: base-4.7.0.0

Instance details

Defined in GHC.TypeLits

Read SomeNat

Since: base-4.7.0.0

Instance details

Defined in GHC.TypeNats

Read IOMode

Since: base-4.2.0.0

Instance details

Defined in GHC.IO.IOMode

Read Lexeme

Since: base-2.1

Instance details

Defined in GHC.Read

Read GeneralCategory

Since: base-2.1

Instance details

Defined in GHC.Read

Read IntSet 
Instance details

Defined in Data.IntSet.Internal

Read Signature 
Instance details

Defined in Crypto.PubKey.ECC.ECDSA

Read PrivateKey 
Instance details

Defined in Crypto.PubKey.ECC.ECDSA

Read PublicKey 
Instance details

Defined in Crypto.PubKey.ECC.ECDSA

Read KeyPair 
Instance details

Defined in Crypto.PubKey.ECC.ECDSA

Read Pos 
Instance details

Defined in Text.Megaparsec.Pos

Read SourcePos 
Instance details

Defined in Text.Megaparsec.Pos

Read Undefined 
Instance details

Defined in Universum.Debug

Read DatatypeVariant 
Instance details

Defined in Language.Haskell.TH.Datatype

Read UnpackedUUID 
Instance details

Defined in Data.UUID.Types.Internal

Methods

readsPrec :: Int -> ReadS UnpackedUUID #

readList :: ReadS [UnpackedUUID] #

readPrec :: ReadPrec UnpackedUUID #

readListPrec :: ReadPrec [UnpackedUUID] #

Read UUID 
Instance details

Defined in Data.UUID.Types.Internal

Class () (Read a) 
Instance details

Defined in Data.Constraint

Methods

cls :: Read a :- () #

a :=> (Read (Dict a)) 
Instance details

Defined in Data.Constraint

Methods

ins :: a :- Read (Dict a) #

() :=> (Read Bool) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Read Bool #

() :=> (Read Char) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Read Char #

() :=> (Read Int) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Read Int #

() :=> (Read Natural) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Read Natural #

() :=> (Read Ordering) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Read Ordering #

() :=> (Read Word) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Read Word #

() :=> (Read ()) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Read () #

Read a => Read [a]

Since: base-2.1

Instance details

Defined in GHC.Read

Methods

readsPrec :: Int -> ReadS [a] #

readList :: ReadS [[a]] #

readPrec :: ReadPrec [a] #

readListPrec :: ReadPrec [[a]] #

Read a => Read (Maybe a)

Since: base-2.1

Instance details

Defined in GHC.Read

(Integral a, Read a) => Read (Ratio a)

Since: base-2.1

Instance details

Defined in GHC.Read

Read p => Read (Par1 p)

Since: base-4.7.0.0

Instance details

Defined in GHC.Generics

Read a => Read (Complex a)

Since: base-2.1

Instance details

Defined in Data.Complex

Read a => Read (Min a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Read a => Read (Max a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Read a => Read (First a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Read a => Read (Last a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Read m => Read (WrappedMonoid m)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Read a => Read (Option a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Read a => Read (ZipList a)

Since: base-4.7.0.0

Instance details

Defined in Control.Applicative

Read a => Read (Identity a)

This instance would be equivalent to the derived instances of the Identity newtype if the runIdentity field were removed

Since: base-4.8.0.0

Instance details

Defined in Data.Functor.Identity

Read a => Read (First a)

Since: base-2.1

Instance details

Defined in Data.Monoid

Read a => Read (Last a)

Since: base-2.1

Instance details

Defined in Data.Monoid

Read a => Read (Dual a)

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Read a => Read (Sum a)

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Read a => Read (Product a)

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Read a => Read (Down a)

Since: base-4.7.0.0

Instance details

Defined in Data.Ord

Read a => Read (NonEmpty a)

Since: base-4.11.0.0

Instance details

Defined in GHC.Read

a => Read (Dict a) 
Instance details

Defined in Data.Constraint

Read e => Read (IntMap e) 
Instance details

Defined in Data.IntMap.Internal

Read a => Read (Tree a) 
Instance details

Defined in Data.Tree

Read a => Read (Seq a) 
Instance details

Defined in Data.Sequence.Internal

Read a => Read (ViewL a) 
Instance details

Defined in Data.Sequence.Internal

Read a => Read (ViewR a) 
Instance details

Defined in Data.Sequence.Internal

(Read a, Ord a) => Read (Set a) 
Instance details

Defined in Data.Set.Internal

Read a => Read (DList a) 
Instance details

Defined in Data.DList

(Read a, Prim a) => Read (Vector a) 
Instance details

Defined in Data.Vector.Primitive

(Read a, Storable a) => Read (Vector a) 
Instance details

Defined in Data.Vector.Storable

(Eq a, Hashable a, Read a) => Read (HashSet a) 
Instance details

Defined in Data.HashSet.Base

Read a => Read (Vector a) 
Instance details

Defined in Data.Vector

Read t => Read (ErrorItem t) 
Instance details

Defined in Text.Megaparsec.Error

Read e => Read (ErrorFancy e) 
Instance details

Defined in Text.Megaparsec.Error

Read a => Read (SmallArray a) 
Instance details

Defined in Data.Primitive.SmallArray

Read a => Read (Array a) 
Instance details

Defined in Data.Primitive.Array

(Read a) :=> (Read (Complex a)) 
Instance details

Defined in Data.Constraint

Methods

ins :: Read a :- Read (Complex a) #

(Read a) :=> (Read [a]) 
Instance details

Defined in Data.Constraint

Methods

ins :: Read a :- Read [a] #

(Read a) :=> (Read (Maybe a)) 
Instance details

Defined in Data.Constraint

Methods

ins :: Read a :- Read (Maybe a) #

(Read a) :=> (Read (Identity a)) 
Instance details

Defined in Data.Constraint

Methods

ins :: Read a :- Read (Identity a) #

(Read a) :=> (Read (Const a b)) 
Instance details

Defined in Data.Constraint

Methods

ins :: Read a :- Read (Const a b) #

(Read a, Read b) => Read (Either a b)

Since: base-3.0

Instance details

Defined in Data.Either

Read (V1 p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Read (U1 p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

(Read a, Read b) => Read (a, b)

Since: base-2.1

Instance details

Defined in GHC.Read

Methods

readsPrec :: Int -> ReadS (a, b) #

readList :: ReadS [(a, b)] #

readPrec :: ReadPrec (a, b) #

readListPrec :: ReadPrec [(a, b)] #

(Eq k, Hashable k, Read k, Read e) => Read (HashMap k e) 
Instance details

Defined in Data.HashMap.Base

(Ord k, Read k, Read e) => Read (Map k e) 
Instance details

Defined in Data.Map.Internal

Methods

readsPrec :: Int -> ReadS (Map k e) #

readList :: ReadS [Map k e] #

readPrec :: ReadPrec (Map k e) #

readListPrec :: ReadPrec [Map k e] #

(Ix a, Read a, Read b) => Read (Array a b)

Since: base-2.1

Instance details

Defined in GHC.Read

(Read a, Read b) => Read (Arg a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

readsPrec :: Int -> ReadS (Arg a b) #

readList :: ReadS [Arg a b] #

readPrec :: ReadPrec (Arg a b) #

readListPrec :: ReadPrec [Arg a b] #

Read (Proxy t)

Since: base-4.7.0.0

Instance details

Defined in Data.Proxy

(Read1 m, Read a) => Read (MaybeT m a) 
Instance details

Defined in Control.Monad.Trans.Maybe

(Read1 f, Read a) => Read (Cofree f a) 
Instance details

Defined in Control.Comonad.Cofree

(Read1 f, Read a) => Read (Free f a) 
Instance details

Defined in Control.Monad.Free

Methods

readsPrec :: Int -> ReadS (Free f a) #

readList :: ReadS [Free f a] #

readPrec :: ReadPrec (Free f a) #

readListPrec :: ReadPrec [Free f a] #

(Functor f, Read (f a)) => Read (Yoneda f a) 
Instance details

Defined in Data.Functor.Yoneda

(Integral a, Read a) :=> (Read (Ratio a)) 
Instance details

Defined in Data.Constraint

Methods

ins :: (Integral a, Read a) :- Read (Ratio a) #

(Read a, Read b) :=> (Read (a, b)) 
Instance details

Defined in Data.Constraint

Methods

ins :: (Read a, Read b) :- Read (a, b) #

(Read a, Read b) :=> (Read (Either a b)) 
Instance details

Defined in Data.Constraint

Methods

ins :: (Read a, Read b) :- Read (Either a b) #

Read (f p) => Read (Rec1 f p)

Since: base-4.7.0.0

Instance details

Defined in GHC.Generics

Methods

readsPrec :: Int -> ReadS (Rec1 f p) #

readList :: ReadS [Rec1 f p] #

readPrec :: ReadPrec (Rec1 f p) #

readListPrec :: ReadPrec [Rec1 f p] #

(Read a, Read b, Read c) => Read (a, b, c)

Since: base-2.1

Instance details

Defined in GHC.Read

Methods

readsPrec :: Int -> ReadS (a, b, c) #

readList :: ReadS [(a, b, c)] #

readPrec :: ReadPrec (a, b, c) #

readListPrec :: ReadPrec [(a, b, c)] #

Read a => Read (Const a b)

This instance would be equivalent to the derived instances of the Const newtype if the getConst field were removed

Since: base-4.8.0.0

Instance details

Defined in Data.Functor.Const

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] #

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] #

Coercible a b => Read (Coercion a b)

Since: base-4.7.0.0

Instance details

Defined in Data.Type.Coercion

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] #

Read (p a a) => Read (Join p a) 
Instance details

Defined in Data.Bifunctor.Join

Methods

readsPrec :: Int -> ReadS (Join p a) #

readList :: ReadS [Join p a] #

readPrec :: ReadPrec (Join p a) #

readListPrec :: ReadPrec [Join p a] #

Read (p (Fix p a) a) => Read (Fix p a) 
Instance details

Defined in Data.Bifunctor.Fix

Methods

readsPrec :: Int -> ReadS (Fix p a) #

readList :: ReadS [Fix p a] #

readPrec :: ReadPrec (Fix p a) #

readListPrec :: ReadPrec [Fix p a] #

(Read1 f, Read a) => Read (IdentityT f a) 
Instance details

Defined in Control.Monad.Trans.Identity

(Read e, Read1 m, Read a) => Read (ExceptT e m a) 
Instance details

Defined in Control.Monad.Trans.Except

Methods

readsPrec :: Int -> ReadS (ExceptT e m a) #

readList :: ReadS [ExceptT e m a] #

readPrec :: ReadPrec (ExceptT e m a) #

readListPrec :: ReadPrec [ExceptT e m a] #

(Read a, Read (f b)) => Read (FreeF f a b) 
Instance details

Defined in Control.Monad.Trans.Free

Methods

readsPrec :: Int -> ReadS (FreeF f a b) #

readList :: ReadS [FreeF f a b] #

readPrec :: ReadPrec (FreeF f a b) #

readListPrec :: ReadPrec [FreeF f a b] #

(Read1 f, Read1 m, Read a) => Read (FreeT f m a) 
Instance details

Defined in Control.Monad.Trans.Free

Methods

readsPrec :: Int -> ReadS (FreeT f m a) #

readList :: ReadS [FreeT f m a] #

readPrec :: ReadPrec (FreeT f m a) #

readListPrec :: ReadPrec [FreeT f m a] #

(Read a, Read (f b)) => Read (CofreeF f a b) 
Instance details

Defined in Control.Comonad.Trans.Cofree

Methods

readsPrec :: Int -> ReadS (CofreeF f a b) #

readList :: ReadS [CofreeF f a b] #

readPrec :: ReadPrec (CofreeF f a b) #

readListPrec :: ReadPrec [CofreeF f a b] #

Read (w (CofreeF f a (CofreeT f w a))) => Read (CofreeT f w a) 
Instance details

Defined in Control.Comonad.Trans.Cofree

Methods

readsPrec :: Int -> ReadS (CofreeT f w a) #

readList :: ReadS [CofreeT f w a] #

readPrec :: ReadPrec (CofreeT f w a) #

readListPrec :: ReadPrec [CofreeT f w a] #

(Read e, Read1 m, Read a) => Read (ErrorT e m a) 
Instance details

Defined in Control.Monad.Trans.Error

Methods

readsPrec :: Int -> ReadS (ErrorT e m a) #

readList :: ReadS [ErrorT e m a] #

readPrec :: ReadPrec (ErrorT e m a) #

readListPrec :: ReadPrec [ErrorT e m a] #

Read b => Read (Tagged s b) 
Instance details

Defined in Data.Tagged

Read c => Read (K1 i c p)

Since: base-4.7.0.0

Instance details

Defined in GHC.Generics

Methods

readsPrec :: Int -> ReadS (K1 i c p) #

readList :: ReadS [K1 i c p] #

readPrec :: ReadPrec (K1 i c p) #

readListPrec :: ReadPrec [K1 i c p] #

(Read (f p), Read (g p)) => Read ((f :+: g) p)

Since: base-4.7.0.0

Instance details

Defined in GHC.Generics

Methods

readsPrec :: Int -> ReadS ((f :+: g) p) #

readList :: ReadS [(f :+: g) p] #

readPrec :: ReadPrec ((f :+: g) p) #

readListPrec :: ReadPrec [(f :+: g) p] #

(Read (f p), Read (g p)) => Read ((f :*: g) p)

Since: base-4.7.0.0

Instance details

Defined in GHC.Generics

Methods

readsPrec :: Int -> ReadS ((f :*: g) p) #

readList :: ReadS [(f :*: g) p] #

readPrec :: ReadPrec ((f :*: g) p) #

readListPrec :: ReadPrec [(f :*: g) p] #

(Read a, Read b, Read c, Read d) => Read (a, b, c, d)

Since: base-2.1

Instance details

Defined in GHC.Read

Methods

readsPrec :: Int -> ReadS (a, b, c, d) #

readList :: ReadS [(a, b, c, d)] #

readPrec :: ReadPrec (a, b, c, d) #

readListPrec :: ReadPrec [(a, b, c, d)] #

(Read1 f, Read1 g, Read a) => Read (Product f g a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Product

Methods

readsPrec :: Int -> ReadS (Product f g a) #

readList :: ReadS [Product f g a] #

readPrec :: ReadPrec (Product f g a) #

readListPrec :: ReadPrec [Product f g a] #

(Read1 f, Read1 g, Read a) => Read (Sum f g a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Sum

Methods

readsPrec :: Int -> ReadS (Sum f g a) #

readList :: ReadS [Sum f g a] #

readPrec :: ReadPrec (Sum f g a) #

readListPrec :: ReadPrec [Sum f g a] #

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] #

Read (f p) => Read (M1 i c f p)

Since: base-4.7.0.0

Instance details

Defined in GHC.Generics

Methods

readsPrec :: Int -> ReadS (M1 i c f p) #

readList :: ReadS [M1 i c f p] #

readPrec :: ReadPrec (M1 i c f p) #

readListPrec :: ReadPrec [M1 i c f p] #

Read (f (g p)) => Read ((f :.: g) p)

Since: base-4.7.0.0

Instance details

Defined in GHC.Generics

Methods

readsPrec :: Int -> ReadS ((f :.: g) p) #

readList :: ReadS [(f :.: g) p] #

readPrec :: ReadPrec ((f :.: g) p) #

readListPrec :: ReadPrec [(f :.: g) p] #

(Read a, Read b, Read c, Read d, Read e) => Read (a, b, c, d, e)

Since: base-2.1

Instance details

Defined in GHC.Read

Methods

readsPrec :: Int -> ReadS (a, b, c, d, e) #

readList :: ReadS [(a, b, c, d, e)] #

readPrec :: ReadPrec (a, b, c, d, e) #

readListPrec :: ReadPrec [(a, b, c, d, e)] #

(Read1 f, Read1 g, Read a) => Read (Compose f g a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Compose

Methods

readsPrec :: Int -> ReadS (Compose f g a) #

readList :: ReadS [Compose f g a] #

readPrec :: ReadPrec (Compose f g a) #

readListPrec :: ReadPrec [Compose f g a] #

Read (p a b) => Read (WrappedBifunctor p a b) 
Instance details

Defined in Data.Bifunctor.Wrapped

Read (g b) => Read (Joker g a b) 
Instance details

Defined in Data.Bifunctor.Joker

Methods

readsPrec :: Int -> ReadS (Joker g a b) #

readList :: ReadS [Joker g a b] #

readPrec :: ReadPrec (Joker g a b) #

readListPrec :: ReadPrec [Joker g a b] #

Read (p b a) => Read (Flip p a b) 
Instance details

Defined in Data.Bifunctor.Flip

Methods

readsPrec :: Int -> ReadS (Flip p a b) #

readList :: ReadS [Flip p a b] #

readPrec :: ReadPrec (Flip p a b) #

readListPrec :: ReadPrec [Flip p a b] #

Read (f a) => Read (Clown f a b) 
Instance details

Defined in Data.Bifunctor.Clown

Methods

readsPrec :: Int -> ReadS (Clown f a b) #

readList :: ReadS [Clown f a b] #

readPrec :: ReadPrec (Clown f a b) #

readListPrec :: ReadPrec [Clown f a b] #

(Read a, Read b, Read c, Read d, Read e, Read f) => Read (a, b, c, d, e, f)

Since: base-2.1

Instance details

Defined in GHC.Read

Methods

readsPrec :: Int -> ReadS (a, b, c, d, e, f) #

readList :: ReadS [(a, b, c, d, e, f)] #

readPrec :: ReadPrec (a, b, c, d, e, f) #

readListPrec :: ReadPrec [(a, b, c, d, e, f)] #

(Read (p a b), Read (q a b)) => Read (Sum p q a b) 
Instance details

Defined in Data.Bifunctor.Sum

Methods

readsPrec :: Int -> ReadS (Sum p q a b) #

readList :: ReadS [Sum p q a b] #

readPrec :: ReadPrec (Sum p q a b) #

readListPrec :: ReadPrec [Sum p q a b] #

(Read (f a b), Read (g a b)) => Read (Product f g a b) 
Instance details

Defined in Data.Bifunctor.Product

Methods

readsPrec :: Int -> ReadS (Product f g a b) #

readList :: ReadS [Product f g a b] #

readPrec :: ReadPrec (Product f g a b) #

readListPrec :: ReadPrec [Product f g a b] #

(Read a, Read b, Read c, Read d, Read e, Read f, Read g) => Read (a, b, c, d, e, f, g)

Since: base-2.1

Instance details

Defined in GHC.Read

Methods

readsPrec :: Int -> ReadS (a, b, c, d, e, f, g) #

readList :: ReadS [(a, b, c, d, e, f, g)] #

readPrec :: ReadPrec (a, b, c, d, e, f, g) #

readListPrec :: ReadPrec [(a, b, c, d, e, f, g)] #

Read (f (p a b)) => Read (Tannen f p a b) 
Instance details

Defined in Data.Bifunctor.Tannen

Methods

readsPrec :: Int -> ReadS (Tannen f p a b) #

readList :: ReadS [Tannen f p a b] #

readPrec :: ReadPrec (Tannen f p a b) #

readListPrec :: ReadPrec [Tannen f p a b] #

(Read a, Read b, Read c, Read d, Read e, Read f, Read g, Read h) => Read (a, b, c, d, e, f, g, h)

Since: base-2.1

Instance details

Defined in GHC.Read

Methods

readsPrec :: Int -> ReadS (a, b, c, d, e, f, g, h) #

readList :: ReadS [(a, b, c, d, e, f, g, h)] #

readPrec :: ReadPrec (a, b, c, d, e, f, g, h) #

readListPrec :: ReadPrec [(a, b, c, d, e, f, g, h)] #

(Read a, Read b, Read c, Read d, Read e, Read f, Read g, Read h, Read i) => Read (a, b, c, d, e, f, g, h, i)

Since: base-2.1

Instance details

Defined in GHC.Read

Methods

readsPrec :: Int -> ReadS (a, b, c, d, e, f, g, h, i) #

readList :: ReadS [(a, b, c, d, e, f, g, h, i)] #

readPrec :: ReadPrec (a, b, c, d, e, f, g, h, i) #

readListPrec :: ReadPrec [(a, b, c, d, e, f, g, h, i)] #

Read (p (f a) (g b)) => Read (Biff p f g a b) 
Instance details

Defined in Data.Bifunctor.Biff

Methods

readsPrec :: Int -> ReadS (Biff p f g a b) #

readList :: ReadS [Biff p f g a b] #

readPrec :: ReadPrec (Biff p f g a b) #

readListPrec :: ReadPrec [Biff p f g a b] #

(Read a, Read b, Read c, Read d, Read e, Read f, Read g, Read h, Read i, Read j) => Read (a, b, c, d, e, f, g, h, i, j)

Since: base-2.1

Instance details

Defined in GHC.Read

Methods

readsPrec :: Int -> ReadS (a, b, c, d, e, f, g, h, i, j) #

readList :: ReadS [(a, b, c, d, e, f, g, h, i, j)] #

readPrec :: ReadPrec (a, b, c, d, e, f, g, h, i, j) #

readListPrec :: ReadPrec [(a, b, c, d, e, f, g, h, i, j)] #

(Read a, Read b, Read c, Read d, Read e, Read f, Read g, Read h, Read i, Read j, Read k) => Read (a, b, c, d, e, f, g, h, i, j, k)

Since: base-2.1

Instance details

Defined in GHC.Read

Methods

readsPrec :: Int -> ReadS (a, b, c, d, e, f, g, h, i, j, k) #

readList :: ReadS [(a, b, c, d, e, f, g, h, i, j, k)] #

readPrec :: ReadPrec (a, b, c, d, e, f, g, h, i, j, k) #

readListPrec :: ReadPrec [(a, b, c, d, e, f, g, h, i, j, k)] #

(Read a, Read b, Read c, Read d, Read e, Read f, Read g, Read h, Read i, Read j, Read k, Read l) => Read (a, b, c, d, e, f, g, h, i, j, k, l)

Since: base-2.1

Instance details

Defined in GHC.Read

Methods

readsPrec :: Int -> ReadS (a, b, c, d, e, f, g, h, i, j, k, l) #

readList :: ReadS [(a, b, c, d, e, f, g, h, i, j, k, l)] #

readPrec :: ReadPrec (a, b, c, d, e, f, g, h, i, j, k, l) #

readListPrec :: ReadPrec [(a, b, c, d, e, f, g, h, i, j, k, l)] #

(Read a, Read b, Read c, Read d, Read e, Read f, Read g, Read h, Read i, Read j, Read k, Read l, Read m) => Read (a, b, c, d, e, f, g, h, i, j, k, l, m)

Since: base-2.1

Instance details

Defined in GHC.Read

Methods

readsPrec :: Int -> ReadS (a, b, c, d, e, f, g, h, i, j, k, l, m) #

readList :: ReadS [(a, b, c, d, e, f, g, h, i, j, k, l, m)] #

readPrec :: ReadPrec (a, b, c, d, e, f, g, h, i, j, k, l, m) #

readListPrec :: ReadPrec [(a, b, c, d, e, f, g, h, i, j, k, l, m)] #

(Read a, Read b, Read c, Read d, Read e, Read f, Read g, Read h, Read i, Read j, Read k, Read l, Read m, Read n) => Read (a, b, c, d, e, f, g, h, i, j, k, l, m, n)

Since: base-2.1

Instance details

Defined in GHC.Read

Methods

readsPrec :: Int -> ReadS (a, b, c, d, e, f, g, h, i, j, k, l, m, n) #

readList :: ReadS [(a, b, c, d, e, f, g, h, i, j, k, l, m, n)] #

readPrec :: ReadPrec (a, b, c, d, e, f, g, h, i, j, k, l, m, n) #

readListPrec :: ReadPrec [(a, b, c, d, e, f, g, h, i, j, k, l, m, n)] #

(Read a, Read b, Read c, Read d, Read e, Read f, Read g, Read h, Read i, Read j, Read k, Read l, Read m, Read n, Read o) => Read (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o)

Since: base-2.1

Instance details

Defined in GHC.Read

Methods

readsPrec :: Int -> ReadS (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) #

readList :: ReadS [(a, b, c, d, e, f, g, h, i, j, k, l, m, n, o)] #

readPrec :: ReadPrec (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) #

readListPrec :: ReadPrec [(a, b, c, d, e, f, g, h, i, j, k, l, m, n, o)] #

class (Num a, Ord a) => Real a where #

Methods

toRational :: a -> Rational #

the rational equivalent of its real argument with full precision

Instances

Instances details
Real Int

Since: base-2.0.1

Instance details

Defined in GHC.Real

Methods

toRational :: Int -> Rational #

Real Int8

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

toRational :: Int8 -> Rational #

Real Int16

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

toRational :: Int16 -> Rational #

Real Int32

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

toRational :: Int32 -> Rational #

Real Int64

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

toRational :: Int64 -> Rational #

Real Integer

Since: base-2.0.1

Instance details

Defined in GHC.Real

Real Natural

Since: base-4.8.0.0

Instance details

Defined in GHC.Real

Real Word

Since: base-2.1

Instance details

Defined in GHC.Real

Methods

toRational :: Word -> Rational #

Real Word8

Since: base-2.1

Instance details

Defined in GHC.Word

Methods

toRational :: Word8 -> Rational #

Real Word16

Since: base-2.1

Instance details

Defined in GHC.Word

Real Word32

Since: base-2.1

Instance details

Defined in GHC.Word

Real Word64

Since: base-2.1

Instance details

Defined in GHC.Word

Real Scientific

WARNING: toRational needs to compute the Integer magnitude: 10^e. If applied to a huge exponent this could fill up all space and crash your program!

Avoid applying toRational (or realToFrac) to scientific numbers coming from an untrusted source and use toRealFloat instead. The latter guards against excessive space usage.

Instance details

Defined in Data.Scientific

Real RefId Source # 
Instance details

Defined in Indigo.Internal.State

Methods

toRational :: RefId -> Rational #

() :=> (Real Double) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Real Double #

() :=> (Real Float) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Real Float #

() :=> (Real Int) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Real Int #

() :=> (Real Integer) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Real Integer #

() :=> (Real Natural) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Real Natural #

() :=> (Real Word) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Real Word #

Integral a => Real (Ratio a)

Since: base-2.0.1

Instance details

Defined in GHC.Real

Methods

toRational :: Ratio a -> Rational #

Real a => Real (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

Methods

toRational :: Identity a -> Rational #

(Real t, KnownSymbol s) => Real (ElField '(s, t)) 
Instance details

Defined in Data.Vinyl.Functor

Methods

toRational :: ElField '(s, t) -> Rational #

(Integral a) :=> (Real (Ratio a)) 
Instance details

Defined in Data.Constraint

Methods

ins :: Integral a :- Real (Ratio a) #

(Real a) :=> (Real (Identity a)) 
Instance details

Defined in Data.Constraint

Methods

ins :: Real a :- Real (Identity a) #

(Real a) :=> (Real (Const a b)) 
Instance details

Defined in Data.Constraint

Methods

ins :: Real a :- Real (Const a b) #

Class (Num a, Ord a) (Real a) 
Instance details

Defined in Data.Constraint

Methods

cls :: Real a :- (Num a, Ord a) #

Class (Real a, Fractional a) (RealFrac a) 
Instance details

Defined in Data.Constraint

Methods

cls :: RealFrac a :- (Real a, Fractional a) #

Class (Real a, Enum a) (Integral a) 
Instance details

Defined in Data.Constraint

Methods

cls :: Integral a :- (Real a, Enum a) #

Real a => Real (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Methods

toRational :: Const a b -> Rational #

Real a => Real (Tagged s a) 
Instance details

Defined in Data.Tagged

Methods

toRational :: Tagged s a -> Rational #

class (Real a, Fractional a) => RealFrac a where #

Extracting components of fractions.

Minimal complete definition

properFraction

Methods

properFraction :: Integral b => a -> (b, a) #

The function properFraction takes a real fractional number x and returns a pair (n,f) such that x = n+f, and:

  • n is an integral number with the same sign as x; and
  • f is a fraction with the same type and sign as x, and with absolute value less than 1.

The default definitions of the ceiling, floor, truncate and round functions are in terms of properFraction.

truncate :: Integral b => a -> b #

truncate x returns the integer nearest x between zero and x

round :: Integral b => a -> b #

round x returns the nearest integer to x; the even integer if x is equidistant between two integers

ceiling :: Integral b => a -> b #

ceiling x returns the least integer not less than x

floor :: Integral b => a -> b #

floor x returns the greatest integer not greater than x

Instances

Instances details
RealFrac Scientific

WARNING: the methods of the RealFrac instance need to compute the magnitude 10^e. If applied to a huge exponent this could take a long time. Even worse, when the destination type is unbounded (i.e. Integer) it could fill up all space and crash your program!

Instance details

Defined in Data.Scientific

() :=> (RealFrac Double) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- RealFrac Double #

() :=> (RealFrac Float) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- RealFrac Float #

Integral a => RealFrac (Ratio a)

Since: base-2.0.1

Instance details

Defined in GHC.Real

Methods

properFraction :: Integral b => Ratio a -> (b, Ratio a) #

truncate :: Integral b => Ratio a -> b #

round :: Integral b => Ratio a -> b #

ceiling :: Integral b => Ratio a -> b #

floor :: Integral b => Ratio a -> b #

RealFrac a => RealFrac (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

Methods

properFraction :: Integral b => Identity a -> (b, Identity a) #

truncate :: Integral b => Identity a -> b #

round :: Integral b => Identity a -> b #

ceiling :: Integral b => Identity a -> b #

floor :: Integral b => Identity a -> b #

(RealFrac t, KnownSymbol s) => RealFrac (ElField '(s, t)) 
Instance details

Defined in Data.Vinyl.Functor

Methods

properFraction :: Integral b => ElField '(s, t) -> (b, ElField '(s, t)) #

truncate :: Integral b => ElField '(s, t) -> b #

round :: Integral b => ElField '(s, t) -> b #

ceiling :: Integral b => ElField '(s, t) -> b #

floor :: Integral b => ElField '(s, t) -> b #

(Integral a) :=> (RealFrac (Ratio a)) 
Instance details

Defined in Data.Constraint

Methods

ins :: Integral a :- RealFrac (Ratio a) #

(RealFrac a) :=> (RealFrac (Identity a)) 
Instance details

Defined in Data.Constraint

Methods

ins :: RealFrac a :- RealFrac (Identity a) #

(RealFrac a) :=> (RealFrac (Const a b)) 
Instance details

Defined in Data.Constraint

Methods

ins :: RealFrac a :- RealFrac (Const a b) #

Class (Real a, Fractional a) (RealFrac a) 
Instance details

Defined in Data.Constraint

Methods

cls :: RealFrac a :- (Real a, Fractional a) #

Class (RealFrac a, Floating a) (RealFloat a) 
Instance details

Defined in Data.Constraint

Methods

cls :: RealFloat a :- (RealFrac a, Floating a) #

RealFrac a => RealFrac (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Methods

properFraction :: Integral b0 => Const a b -> (b0, Const a b) #

truncate :: Integral b0 => Const a b -> b0 #

round :: Integral b0 => Const a b -> b0 #

ceiling :: Integral b0 => Const a b -> b0 #

floor :: Integral b0 => Const a b -> b0 #

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 #

class Show a #

Conversion of values to readable Strings.

Derived instances of Show have the following properties, which are compatible with derived instances of Read:

  • The result of show is a syntactically correct Haskell expression containing only constants, given the fixity declarations in force at the point where the type is declared. It contains only the constructor names defined in the data type, parentheses, and spaces. When labelled constructor fields are used, braces, commas, field names, and equal signs are also used.
  • If the constructor is defined to be an infix operator, then showsPrec will produce infix applications of the constructor.
  • the representation will be enclosed in parentheses if the precedence of the top-level constructor in x is less than d (associativity is ignored). Thus, if d is 0 then the result is never surrounded in parentheses; if d is 11 it is always surrounded in parentheses, unless it is an atomic expression.
  • If the constructor is defined using record syntax, then show will produce the record-syntax form, with the fields given in the same order as the original declaration.

For example, given the declarations

infixr 5 :^:
data Tree a =  Leaf a  |  Tree a :^: Tree a

the derived instance of Show is equivalent to

instance (Show a) => Show (Tree a) where

       showsPrec d (Leaf m) = showParen (d > app_prec) $
            showString "Leaf " . showsPrec (app_prec+1) m
         where app_prec = 10

       showsPrec d (u :^: v) = showParen (d > up_prec) $
            showsPrec (up_prec+1) u .
            showString " :^: "      .
            showsPrec (up_prec+1) v
         where up_prec = 5

Note that right-associativity of :^: is ignored. For example,

  • show (Leaf 1 :^: Leaf 2 :^: Leaf 3) produces the string "Leaf 1 :^: (Leaf 2 :^: Leaf 3)".

Minimal complete definition

showsPrec | show

Instances

Instances details
Show Bool

Since: base-2.1

Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> Bool -> ShowS #

show :: Bool -> String #

showList :: [Bool] -> ShowS #

Show Char

Since: base-2.1

Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> Char -> ShowS #

show :: Char -> String #

showList :: [Char] -> ShowS #

Show Int

Since: base-2.1

Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> Int -> ShowS #

show :: Int -> String #

showList :: [Int] -> ShowS #

Show Int8

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

showsPrec :: Int -> Int8 -> ShowS #

show :: Int8 -> String #

showList :: [Int8] -> ShowS #

Show Int16

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

showsPrec :: Int -> Int16 -> ShowS #

show :: Int16 -> String #

showList :: [Int16] -> ShowS #

Show Int32

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

showsPrec :: Int -> Int32 -> ShowS #

show :: Int32 -> String #

showList :: [Int32] -> ShowS #

Show Int64

Since: base-2.1

Instance details

Defined in GHC.Int

Methods

showsPrec :: Int -> Int64 -> ShowS #

show :: Int64 -> String #

showList :: [Int64] -> ShowS #

Show Integer

Since: base-2.1

Instance details

Defined in GHC.Show

Show Natural

Since: base-4.8.0.0

Instance details

Defined in GHC.Show

Show Ordering

Since: base-2.1

Instance details

Defined in GHC.Show

Show Word

Since: base-2.1

Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> Word -> ShowS #

show :: Word -> String #

showList :: [Word] -> ShowS #

Show Word8

Since: base-2.1

Instance details

Defined in GHC.Word

Methods

showsPrec :: Int -> Word8 -> ShowS #

show :: Word8 -> String #

showList :: [Word8] -> ShowS #

Show Word16

Since: base-2.1

Instance details

Defined in GHC.Word

Show Word32

Since: base-2.1

Instance details

Defined in GHC.Word

Show Word64

Since: base-2.1

Instance details

Defined in GHC.Word

Show RuntimeRep

Since: base-4.11.0.0

Instance details

Defined in GHC.Show

Show VecCount

Since: base-4.11.0.0

Instance details

Defined in GHC.Show

Show VecElem

Since: base-4.11.0.0

Instance details

Defined in GHC.Show

Show CallStack

Since: base-4.9.0.0

Instance details

Defined in GHC.Show

Show SomeTypeRep

Since: base-4.10.0.0

Instance details

Defined in Data.Typeable.Internal

Show Exp 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> Exp -> ShowS #

show :: Exp -> String #

showList :: [Exp] -> ShowS #

Show Match 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> Match -> ShowS #

show :: Match -> String #

showList :: [Match] -> ShowS #

Show Clause 
Instance details

Defined in Language.Haskell.TH.Syntax

Show Pat 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> Pat -> ShowS #

show :: Pat -> String #

showList :: [Pat] -> ShowS #

Show Type 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> Type -> ShowS #

show :: Type -> String #

showList :: [Type] -> ShowS #

Show Dec 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> Dec -> ShowS #

show :: Dec -> String #

showList :: [Dec] -> ShowS #

Show Name 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> Name -> ShowS #

show :: Name -> String #

showList :: [Name] -> ShowS #

Show FunDep 
Instance details

Defined in Language.Haskell.TH.Syntax

Show InjectivityAnn 
Instance details

Defined in Language.Haskell.TH.Syntax

Show Overlap 
Instance details

Defined in Language.Haskell.TH.Syntax

Show ()

Since: base-2.1

Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> () -> ShowS #

show :: () -> String #

showList :: [()] -> ShowS #

Show TyCon

Since: base-2.1

Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> TyCon -> ShowS #

show :: TyCon -> String #

showList :: [TyCon] -> ShowS #

Show Module

Since: base-4.9.0.0

Instance details

Defined in GHC.Show

Show TrName

Since: base-4.9.0.0

Instance details

Defined in GHC.Show

Show KindRep 
Instance details

Defined in GHC.Show

Show TypeLitSort

Since: base-4.11.0.0

Instance details

Defined in GHC.Show

Show Version

Since: base-2.1

Instance details

Defined in Data.Version

Show Con 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> Con -> ShowS #

show :: Con -> String #

showList :: [Con] -> ShowS #

Show ByteString 
Instance details

Defined in Data.ByteString.Internal

Show ByteString 
Instance details

Defined in Data.ByteString.Lazy.Internal

Show Scientific

See formatScientific if you need more control over the rendering.

Instance details

Defined in Data.Scientific

Show JSONPathElement 
Instance details

Defined in Data.Aeson.Types.Internal

Show Value 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

showsPrec :: Int -> Value -> ShowS #

show :: Value -> String #

showList :: [Value] -> ShowS #

Show DotNetTime 
Instance details

Defined in Data.Aeson.Types.Internal

Show Options 
Instance details

Defined in Data.Aeson.Types.Internal

Show SumEncoding 
Instance details

Defined in Data.Aeson.Types.Internal

Show Handle

Since: base-4.1.0.0

Instance details

Defined in GHC.IO.Handle.Types

Show Pos 
Instance details

Defined in Data.Attoparsec.Internal.Types

Methods

showsPrec :: Int -> Pos -> ShowS #

show :: Pos -> String #

showList :: [Pos] -> ShowS #

Show More 
Instance details

Defined in Data.Attoparsec.Internal.Types

Methods

showsPrec :: Int -> More -> ShowS #

show :: More -> String #

showList :: [More] -> ShowS #

Show Void

Since: base-4.8.0.0

Instance details

Defined in Data.Void

Methods

showsPrec :: Int -> Void -> ShowS #

show :: Void -> String #

showList :: [Void] -> ShowS #

Show DataType

Since: base-4.0.0.0

Instance details

Defined in Data.Data

Show Constr

Since: base-4.0.0.0

Instance details

Defined in Data.Data

Show DataRep

Since: base-4.0.0.0

Instance details

Defined in Data.Data

Show ConstrRep

Since: base-4.0.0.0

Instance details

Defined in Data.Data

Show Fixity

Since: base-4.0.0.0

Instance details

Defined in Data.Data

Show ThreadId

Since: base-4.2.0.0

Instance details

Defined in GHC.Conc.Sync

Show BlockReason

Since: base-4.3.0.0

Instance details

Defined in GHC.Conc.Sync

Show ThreadStatus

Since: base-4.3.0.0

Instance details

Defined in GHC.Conc.Sync

Show BlockedIndefinitelyOnMVar

Since: base-4.1.0.0

Instance details

Defined in GHC.IO.Exception

Show BlockedIndefinitelyOnSTM

Since: base-4.1.0.0

Instance details

Defined in GHC.IO.Exception

Show Deadlock

Since: base-4.1.0.0

Instance details

Defined in GHC.IO.Exception

Show AllocationLimitExceeded

Since: base-4.7.1.0

Instance details

Defined in GHC.IO.Exception

Show CompactionFailed

Since: base-4.10.0.0

Instance details

Defined in GHC.IO.Exception

Show AssertionFailed

Since: base-4.1.0.0

Instance details

Defined in GHC.IO.Exception

Show SomeAsyncException

Since: base-4.7.0.0

Instance details

Defined in GHC.IO.Exception

Show AsyncException

Since: base-4.1.0.0

Instance details

Defined in GHC.IO.Exception

Show ArrayException

Since: base-4.1.0.0

Instance details

Defined in GHC.IO.Exception

Show FixIOException

Since: base-4.11.0.0

Instance details

Defined in GHC.IO.Exception

Show ExitCode 
Instance details

Defined in GHC.IO.Exception

Show IOErrorType

Since: base-4.1.0.0

Instance details

Defined in GHC.IO.Exception

Show HandleType

Since: base-4.1.0.0

Instance details

Defined in GHC.IO.Handle.Types

Show BufferMode

Since: base-4.2.0.0

Instance details

Defined in GHC.IO.Handle.Types

Show Newline

Since: base-4.3.0.0

Instance details

Defined in GHC.IO.Handle.Types

Show NewlineMode

Since: base-4.3.0.0

Instance details

Defined in GHC.IO.Handle.Types

Show MaskingState

Since: base-4.3.0.0

Instance details

Defined in GHC.IO

Show IOException

Since: base-4.1.0.0

Instance details

Defined in GHC.IO.Exception

Show ErrorCall

Since: base-4.0.0.0

Instance details

Defined in GHC.Exception

Show ArithException

Since: base-4.0.0.0

Instance details

Defined in GHC.Exception.Type

Show All

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Methods

showsPrec :: Int -> All -> ShowS #

show :: All -> String #

showList :: [All] -> ShowS #

Show Any

Since: base-2.1

Instance details

Defined in Data.Semigroup.Internal

Methods

showsPrec :: Int -> Any -> ShowS #

show :: Any -> String #

showList :: [Any] -> ShowS #

Show Fixity

Since: base-4.6.0.0

Instance details

Defined in GHC.Generics

Show Associativity

Since: base-4.6.0.0

Instance details

Defined in GHC.Generics

Show SourceUnpackedness

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Show SourceStrictness

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Show DecidedStrictness

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Show SomeSymbol

Since: base-4.7.0.0

Instance details

Defined in GHC.TypeLits

Show SomeNat

Since: base-4.7.0.0

Instance details

Defined in GHC.TypeNats

Show IOMode

Since: base-4.2.0.0

Instance details

Defined in GHC.IO.IOMode

Show SrcLoc

Since: base-4.9.0.0

Instance details

Defined in GHC.Show

Show SomeException

Since: base-3.0

Instance details

Defined in GHC.Exception.Type

Show Alphabet 
Instance details

Defined in Data.ByteString.Base58.Internal

Show ASCII7_Invalid 
Instance details

Defined in Basement.String.Encoding.ASCII7

Methods

showsPrec :: Int -> ASCII7_Invalid -> ShowS #

show :: ASCII7_Invalid -> String #

showList :: [ASCII7_Invalid] -> ShowS #

Show ISO_8859_1_Invalid 
Instance details

Defined in Basement.String.Encoding.ISO_8859_1

Methods

showsPrec :: Int -> ISO_8859_1_Invalid -> ShowS #

show :: ISO_8859_1_Invalid -> String #

showList :: [ISO_8859_1_Invalid] -> ShowS #

Show UTF16_Invalid 
Instance details

Defined in Basement.String.Encoding.UTF16

Methods

showsPrec :: Int -> UTF16_Invalid -> ShowS #

show :: UTF16_Invalid -> String #

showList :: [UTF16_Invalid] -> ShowS #

Show UTF32_Invalid 
Instance details

Defined in Basement.String.Encoding.UTF32

Methods

showsPrec :: Int -> UTF32_Invalid -> ShowS #

show :: UTF32_Invalid -> String #

showList :: [UTF32_Invalid] -> ShowS #

Show Encoding 
Instance details

Defined in Basement.String

Show String 
Instance details

Defined in Basement.UTF8.Base

Show FileSize 
Instance details

Defined in Basement.Types.OffsetSize

Show BimapException 
Instance details

Defined in Data.Bimap

Methods

showsPrec :: Int -> BimapException -> ShowS #

show :: BimapException -> String #

showList :: [BimapException] -> ShowS #

Show IntSet 
Instance details

Defined in Data.IntSet.Internal

Show Signature 
Instance details

Defined in Crypto.PubKey.ECC.ECDSA

Show PrivateKey 
Instance details

Defined in Crypto.PubKey.ECC.ECDSA

Show PublicKey 
Instance details

Defined in Crypto.PubKey.ECC.ECDSA

Show KeyPair 
Instance details

Defined in Crypto.PubKey.ECC.ECDSA

Show SecretKey 
Instance details

Defined in Crypto.PubKey.Ed25519

Show PublicKey 
Instance details

Defined in Crypto.PubKey.Ed25519

Show Signature 
Instance details

Defined in Crypto.PubKey.Ed25519

Show Blake2b_160 
Instance details

Defined in Crypto.Hash.Blake2b

Show Blake2b_224 
Instance details

Defined in Crypto.Hash.Blake2b

Show Blake2b_256 
Instance details

Defined in Crypto.Hash.Blake2b

Show Blake2b_384 
Instance details

Defined in Crypto.Hash.Blake2b

Show Blake2b_512 
Instance details

Defined in Crypto.Hash.Blake2b

Show Blake2bp_512 
Instance details

Defined in Crypto.Hash.Blake2bp

Show Blake2s_160 
Instance details

Defined in Crypto.Hash.Blake2s

Show Blake2s_224 
Instance details

Defined in Crypto.Hash.Blake2s

Show Blake2s_256 
Instance details

Defined in Crypto.Hash.Blake2s

Show Blake2sp_224 
Instance details

Defined in Crypto.Hash.Blake2sp

Show Blake2sp_256 
Instance details

Defined in Crypto.Hash.Blake2sp

Show Keccak_224 
Instance details

Defined in Crypto.Hash.Keccak

Show Keccak_256 
Instance details

Defined in Crypto.Hash.Keccak

Show Keccak_384 
Instance details

Defined in Crypto.Hash.Keccak

Show Keccak_512 
Instance details

Defined in Crypto.Hash.Keccak

Show MD2 
Instance details

Defined in Crypto.Hash.MD2

Methods

showsPrec :: Int -> MD2 -> ShowS #

show :: MD2 -> String #

showList :: [MD2] -> ShowS #

Show MD4 
Instance details

Defined in Crypto.Hash.MD4

Methods

showsPrec :: Int -> MD4 -> ShowS #

show :: MD4 -> String #

showList :: [MD4] -> ShowS #

Show MD5 
Instance details

Defined in Crypto.Hash.MD5

Methods

showsPrec :: Int -> MD5 -> ShowS #

show :: MD5 -> String #

showList :: [MD5] -> ShowS #

Show RIPEMD160 
Instance details

Defined in Crypto.Hash.RIPEMD160

Show SHA1 
Instance details

Defined in Crypto.Hash.SHA1

Methods

showsPrec :: Int -> SHA1 -> ShowS #

show :: SHA1 -> String #

showList :: [SHA1] -> ShowS #

Show SHA224 
Instance details

Defined in Crypto.Hash.SHA224

Show SHA256 
Instance details

Defined in Crypto.Hash.SHA256

Show SHA3_224 
Instance details

Defined in Crypto.Hash.SHA3

Show SHA3_256 
Instance details

Defined in Crypto.Hash.SHA3

Show SHA3_384 
Instance details

Defined in Crypto.Hash.SHA3

Show SHA3_512 
Instance details

Defined in Crypto.Hash.SHA3

Show SHA384 
Instance details

Defined in Crypto.Hash.SHA384

Show SHA512 
Instance details

Defined in Crypto.Hash.SHA512

Show SHA512t_224 
Instance details

Defined in Crypto.Hash.SHA512t

Show SHA512t_256 
Instance details

Defined in Crypto.Hash.SHA512t

Show Skein256_224 
Instance details

Defined in Crypto.Hash.Skein256

Show Skein256_256 
Instance details

Defined in Crypto.Hash.Skein256

Show Skein512_224 
Instance details

Defined in Crypto.Hash.Skein512

Show Skein512_256 
Instance details

Defined in Crypto.Hash.Skein512

Show Skein512_384 
Instance details

Defined in Crypto.Hash.Skein512

Show Skein512_512 
Instance details

Defined in Crypto.Hash.Skein512

Show Tiger 
Instance details

Defined in Crypto.Hash.Tiger

Methods

showsPrec :: Int -> Tiger -> ShowS #

show :: Tiger -> String #

showList :: [Tiger] -> ShowS #

Show Whirlpool 
Instance details

Defined in Crypto.Hash.Whirlpool

Show CryptoError 
Instance details

Defined in Crypto.Error.Types

Show Extension 
Instance details

Defined in GHC.LanguageExtensions.Type

Show ForeignSrcLang 
Instance details

Defined in GHC.ForeignSrcLang.Type

Show Boxed 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> Boxed -> ShowS #

show :: Boxed -> String #

showList :: [Boxed] -> ShowS #

Show Tool 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> Tool -> ShowS #

show :: Tool -> String #

showList :: [Tool] -> ShowS #

Show SrcLoc 
Instance details

Defined in Language.Haskell.Exts.SrcLoc

Show SrcSpan 
Instance details

Defined in Language.Haskell.Exts.SrcLoc

Show SrcSpanInfo 
Instance details

Defined in Language.Haskell.Exts.SrcLoc

Show Mode 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Methods

showsPrec :: Int -> Mode -> ShowS #

show :: Mode -> String #

showList :: [Mode] -> ShowS #

Show Style 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Methods

showsPrec :: Int -> Style -> ShowS #

show :: Style -> String #

showList :: [Style] -> ShowS #

Show AnnLookup 
Instance details

Defined in Language.Haskell.TH.Syntax

Show Role 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> Role -> ShowS #

show :: Role -> String #

showList :: [Role] -> ShowS #

Show TyLit 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> TyLit -> ShowS #

show :: TyLit -> String #

showList :: [TyLit] -> ShowS #

Show FamilyResultSig 
Instance details

Defined in Language.Haskell.TH.Syntax

Show TyVarBndr 
Instance details

Defined in Language.Haskell.TH.Syntax

Show PatSynArgs 
Instance details

Defined in Language.Haskell.TH.Syntax

Show PatSynDir 
Instance details

Defined in Language.Haskell.TH.Syntax

Show Bang 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> Bang -> ShowS #

show :: Bang -> String #

showList :: [Bang] -> ShowS #

Show DecidedStrictness 
Instance details

Defined in Language.Haskell.TH.Syntax

Show SourceStrictness 
Instance details

Defined in Language.Haskell.TH.Syntax

Show SourceUnpackedness 
Instance details

Defined in Language.Haskell.TH.Syntax

Show AnnTarget 
Instance details

Defined in Language.Haskell.TH.Syntax

Show RuleBndr 
Instance details

Defined in Language.Haskell.TH.Syntax

Show Phases 
Instance details

Defined in Language.Haskell.TH.Syntax

Show RuleMatch 
Instance details

Defined in Language.Haskell.TH.Syntax

Show Inline 
Instance details

Defined in Language.Haskell.TH.Syntax

Show Pragma 
Instance details

Defined in Language.Haskell.TH.Syntax

Show Safety 
Instance details

Defined in Language.Haskell.TH.Syntax

Show Callconv 
Instance details

Defined in Language.Haskell.TH.Syntax

Show Foreign 
Instance details

Defined in Language.Haskell.TH.Syntax

Show TySynEqn 
Instance details

Defined in Language.Haskell.TH.Syntax

Show TypeFamilyHead 
Instance details

Defined in Language.Haskell.TH.Syntax

Show DerivStrategy 
Instance details

Defined in Language.Haskell.TH.Syntax

Show DerivClause 
Instance details

Defined in Language.Haskell.TH.Syntax

Show Range 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> Range -> ShowS #

show :: Range -> String #

showList :: [Range] -> ShowS #

Show Stmt 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> Stmt -> ShowS #

show :: Stmt -> String #

showList :: [Stmt] -> ShowS #

Show Guard 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> Guard -> ShowS #

show :: Guard -> String #

showList :: [Guard] -> ShowS #

Show Body 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> Body -> ShowS #

show :: Body -> String #

showList :: [Body] -> ShowS #

Show Lit 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> Lit -> ShowS #

show :: Lit -> String #

showList :: [Lit] -> ShowS #

Show FixityDirection 
Instance details

Defined in Language.Haskell.TH.Syntax

Show Fixity 
Instance details

Defined in Language.Haskell.TH.Syntax

Show ModuleInfo 
Instance details

Defined in Language.Haskell.TH.Syntax

Show Info 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> Info -> ShowS #

show :: Info -> String #

showList :: [Info] -> ShowS #

Show Loc 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> Loc -> ShowS #

show :: Loc -> String #

showList :: [Loc] -> ShowS #

Show NameSpace 
Instance details

Defined in Language.Haskell.TH.Syntax

Show T 
Instance details

Defined in Michelson.Typed.T

Methods

showsPrec :: Int -> T -> ShowS #

show :: T -> String #

showList :: [T] -> ShowS #

Show ParseLorentzError 
Instance details

Defined in Lorentz.Base

Methods

showsPrec :: Int -> ParseLorentzError -> ShowS #

show :: ParseLorentzError -> String #

showList :: [ParseLorentzError] -> ShowS #

Show EntryPointLookupError 
Instance details

Defined in Lorentz.UParam

Show ParamBuilder 
Instance details

Defined in Lorentz.EntryPoints.Doc

Show ParamBuildingDesc 
Instance details

Defined in Lorentz.EntryPoints.Doc

Show ParamBuildingStep 
Instance details

Defined in Lorentz.EntryPoints.Doc

Show DMigrationActionType 
Instance details

Defined in Lorentz.UStore.Migration.Base

Show DMigrationActionDesc 
Instance details

Defined in Lorentz.UStore.Migration.Base

Show MigrationAtom 
Instance details

Defined in Lorentz.UStore.Migration.Base

Show SomeError 
Instance details

Defined in Lorentz.Errors

Show EpCallingStep 
Instance details

Defined in Lorentz.EntryPoints.Core

Show EpName 
Instance details

Defined in Michelson.Untyped.EntryPoints

Show MText 
Instance details

Defined in Michelson.Text

Methods

showsPrec :: Int -> MText -> ShowS #

show :: MText -> String #

showList :: [MText] -> ShowS #

Show KeyHash 
Instance details

Defined in Tezos.Crypto

Show Signature 
Instance details

Defined in Tezos.Crypto

Show PublicKey 
Instance details

Defined in Tezos.Crypto

Show ChainId 
Instance details

Defined in Tezos.Core

Show Timestamp 
Instance details

Defined in Tezos.Core

Show Mutez 
Instance details

Defined in Tezos.Core

Methods

showsPrec :: Int -> Mutez -> ShowS #

show :: Mutez -> String #

showList :: [Mutez] -> ShowS #

Show Address 
Instance details

Defined in Tezos.Address

Show EpAddress 
Instance details

Defined in Michelson.Typed.EntryPoints

Show SomeDocItem

To automatically derive instance Show Michelson.Typed.Instr later.

Instance details

Defined in Michelson.Doc

Show DocItemId 
Instance details

Defined in Michelson.Doc

Show DocGrouping 
Instance details

Defined in Michelson.Doc

Show DType 
Instance details

Defined in Michelson.Typed.Haskell.Doc

Methods

showsPrec :: Int -> DType -> ShowS #

show :: DType -> String #

showList :: [DType] -> ShowS #

Show Pos 
Instance details

Defined in Text.Megaparsec.Pos

Methods

showsPrec :: Int -> Pos -> ShowS #

show :: Pos -> String #

showList :: [Pos] -> ShowS #

Show InvalidPosException 
Instance details

Defined in Text.Megaparsec.Pos

Show SourcePos 
Instance details

Defined in Text.Megaparsec.Pos

Show DocItemPos 
Instance details

Defined in Michelson.Doc

Methods

showsPrec :: Int -> DocItemPos -> ShowS #

show :: DocItemPos -> String #

showList :: [DocItemPos] -> ShowS #

Show AnalyzerRes 
Instance details

Defined in Michelson.Analyzer

Show MichelsonFailed 
Instance details

Defined in Michelson.Interpret

Show InterpretError 
Instance details

Defined in Michelson.Interpret

Show InterpretResult 
Instance details

Defined in Michelson.Interpret

Show MorleyLogs 
Instance details

Defined in Michelson.Interpret

Show RemainingSteps 
Instance details

Defined in Michelson.Interpret

Show InterpreterState 
Instance details

Defined in Michelson.Interpret

Show LetMacro 
Instance details

Defined in Michelson.Macro

Show PairStruct 
Instance details

Defined in Michelson.Macro

Show UnpairStruct 
Instance details

Defined in Michelson.Macro

Show CadrStruct 
Instance details

Defined in Michelson.Macro

Show ParsedOp 
Instance details

Defined in Michelson.Macro

Show Macro 
Instance details

Defined in Michelson.Macro

Methods

showsPrec :: Int -> Macro -> ShowS #

show :: Macro -> String #

showList :: [Macro] -> ShowS #

Show ExpectType 
Instance details

Defined in Michelson.TypeCheck.Error

Show TypeContext 
Instance details

Defined in Michelson.TypeCheck.Error

Show TCTypeError 
Instance details

Defined in Michelson.TypeCheck.Error

Buildable ExpandedInstr => Show TCError 
Instance details

Defined in Michelson.TypeCheck.Error

Show StackSize 
Instance details

Defined in Michelson.TypeCheck.Error

Show SomeHST 
Instance details

Defined in Michelson.TypeCheck.Types

Show SomeContract 
Instance details

Defined in Michelson.TypeCheck.Types

Show CommentType 
Instance details

Defined in Michelson.Typed.Instr

Show DocSection 
Instance details

Defined in Michelson.Doc

Show ArithErrorType 
Instance details

Defined in Michelson.Typed.Arith

Show SetDelegate 
Instance details

Defined in Michelson.Typed.Value

Show ParseEpAddressError 
Instance details

Defined in Michelson.Typed.EntryPoints

Show ArmCoord 
Instance details

Defined in Michelson.Typed.EntryPoints

Show ParamEpError 
Instance details

Defined in Michelson.Typed.EntryPoints

Show AnnConvergeError 
Instance details

Defined in Michelson.Typed.Annotation

Show ExpandedOp 
Instance details

Defined in Michelson.Untyped.Instr

Show OriginationOperation 
Instance details

Defined in Michelson.Untyped.Instr

Show GlobalCounter 
Instance details

Defined in Michelson.Untyped.Instr

Show InternalByteString 
Instance details

Defined in Michelson.Untyped.Value

Show ContractHash 
Instance details

Defined in Tezos.Address

Show OperationHash 
Instance details

Defined in Tezos.Address

Show OriginationIndex 
Instance details

Defined in Tezos.Address

Show ParseAddressError 
Instance details

Defined in Tezos.Address

Show ParseAddressRawError 
Instance details

Defined in Tezos.Address

Show ParseContractAddressError 
Instance details

Defined in Tezos.Address

Show SecretKey 
Instance details

Defined in Tezos.Crypto

Show KeyHashTag 
Instance details

Defined in Tezos.Crypto

Show PublicKey 
Instance details

Defined in Tezos.Crypto.Ed25519

Show SecretKey 
Instance details

Defined in Tezos.Crypto.Ed25519

Show Signature 
Instance details

Defined in Tezos.Crypto.Ed25519

Show PublicKey 
Instance details

Defined in Tezos.Crypto.P256

Show SecretKey 
Instance details

Defined in Tezos.Crypto.P256

Show Signature 
Instance details

Defined in Tezos.Crypto.P256

Show PublicKey 
Instance details

Defined in Tezos.Crypto.Secp256k1

Show SecretKey 
Instance details

Defined in Tezos.Crypto.Secp256k1

Show Signature 
Instance details

Defined in Tezos.Crypto.Secp256k1

Show CustomParserException 
Instance details

Defined in Michelson.Parser.Error

Show StringLiteralParserException 
Instance details

Defined in Michelson.Parser.Error

Show ParserException 
Instance details

Defined in Michelson.Parser.Error

Show EpNameFromRefAnnError 
Instance details

Defined in Michelson.Untyped.EntryPoints

Show Positive 
Instance details

Defined in Util.Positive

Show UnpackError 
Instance details

Defined in Util.Binary

Show Pos 
Instance details

Defined in Michelson.ErrorPos

Methods

showsPrec :: Int -> Pos -> ShowS #

show :: Pos -> String #

showList :: [Pos] -> ShowS #

Show SrcPos 
Instance details

Defined in Michelson.ErrorPos

Show LetName 
Instance details

Defined in Michelson.ErrorPos

Show InstrCallStack 
Instance details

Defined in Michelson.ErrorPos

Show BadTypeForScope 
Instance details

Defined in Michelson.Typed.Scope

Show EntriesOrder 
Instance details

Defined in Michelson.Untyped.Contract

Show StackRef 
Instance details

Defined in Michelson.Untyped.Ext

Show Var 
Instance details

Defined in Michelson.Untyped.Ext

Methods

showsPrec :: Int -> Var -> ShowS #

show :: Var -> String #

showList :: [Var] -> ShowS #

Show TyVar 
Instance details

Defined in Michelson.Untyped.Ext

Methods

showsPrec :: Int -> TyVar -> ShowS #

show :: TyVar -> String #

showList :: [TyVar] -> ShowS #

Show StackTypePattern 
Instance details

Defined in Michelson.Untyped.Ext

Show StackFn 
Instance details

Defined in Michelson.Untyped.Ext

Show PrintComment 
Instance details

Defined in Michelson.Untyped.Ext

Show Type 
Instance details

Defined in Michelson.Untyped.Type

Methods

showsPrec :: Int -> Type -> ShowS #

show :: Type -> String #

showList :: [Type] -> ShowS #

Show ParameterType 
Instance details

Defined in Michelson.Untyped.Type

Show T 
Instance details

Defined in Michelson.Untyped.Type

Methods

showsPrec :: Int -> T -> ShowS #

show :: T -> String #

showList :: [T] -> ShowS #

Show AnnotationSet 
Instance details

Defined in Michelson.Untyped.Annotation

Show CryptoParseError 
Instance details

Defined in Tezos.Crypto.Util

Show B58CheckWithPrefixError 
Instance details

Defined in Tezos.Crypto.Util

Show Bug 
Instance details

Defined in Universum.Exception

Methods

showsPrec :: Int -> Bug -> ShowS #

show :: Bug -> String #

showList :: [Bug] -> ShowS #

Show Undefined 
Instance details

Defined in Universum.Debug

Show UnicodeException 
Instance details

Defined in Data.Text.Encoding.Error

Show Doc 
Instance details

Defined in Text.PrettyPrint.HughesPJ

Methods

showsPrec :: Int -> Doc -> ShowS #

show :: Doc -> String #

showList :: [Doc] -> ShowS #

Show TextDetails 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Show ByteArray

Since: primitive-0.6.3.0

Instance details

Defined in Data.Primitive.ByteArray

Show StringException 
Instance details

Defined in Control.Exception.Safe

Show SyncExceptionWrapper 
Instance details

Defined in Control.Exception.Safe

Show AsyncExceptionWrapper 
Instance details

Defined in Control.Exception.Safe

Show ModName 
Instance details

Defined in Language.Haskell.TH.Syntax

Show PkgName 
Instance details

Defined in Language.Haskell.TH.Syntax

Show Module 
Instance details

Defined in Language.Haskell.TH.Syntax

Show OccName 
Instance details

Defined in Language.Haskell.TH.Syntax

Show NameFlavour 
Instance details

Defined in Language.Haskell.TH.Syntax

Show Decoding 
Instance details

Defined in Data.Text.Encoding

Show DatatypeInfo 
Instance details

Defined in Language.Haskell.TH.Datatype

Show DatatypeVariant 
Instance details

Defined in Language.Haskell.TH.Datatype

Show ConstructorInfo 
Instance details

Defined in Language.Haskell.TH.Datatype

Show ConstructorVariant 
Instance details

Defined in Language.Haskell.TH.Datatype

Show FieldStrictness 
Instance details

Defined in Language.Haskell.TH.Datatype

Show Unpackedness 
Instance details

Defined in Language.Haskell.TH.Datatype

Show Strictness 
Instance details

Defined in Language.Haskell.TH.Datatype

Show DTypeArg 
Instance details

Defined in Language.Haskell.TH.Desugar.Core

Show DExp 
Instance details

Defined in Language.Haskell.TH.Desugar.AST

Methods

showsPrec :: Int -> DExp -> ShowS #

show :: DExp -> String #

showList :: [DExp] -> ShowS #

Show DPat 
Instance details

Defined in Language.Haskell.TH.Desugar.AST

Methods

showsPrec :: Int -> DPat -> ShowS #

show :: DPat -> String #

showList :: [DPat] -> ShowS #

Show DType 
Instance details

Defined in Language.Haskell.TH.Desugar.AST

Methods

showsPrec :: Int -> DType -> ShowS #

show :: DType -> String #

showList :: [DType] -> ShowS #

Show DTyVarBndr 
Instance details

Defined in Language.Haskell.TH.Desugar.AST

Show DMatch 
Instance details

Defined in Language.Haskell.TH.Desugar.AST

Show DClause 
Instance details

Defined in Language.Haskell.TH.Desugar.AST

Show DLetDec 
Instance details

Defined in Language.Haskell.TH.Desugar.AST

Show NewOrData 
Instance details

Defined in Language.Haskell.TH.Desugar.AST

Show DDec 
Instance details

Defined in Language.Haskell.TH.Desugar.AST

Methods

showsPrec :: Int -> DDec -> ShowS #

show :: DDec -> String #

showList :: [DDec] -> ShowS #

Show DPatSynDir 
Instance details

Defined in Language.Haskell.TH.Desugar.AST

Show DTypeFamilyHead 
Instance details

Defined in Language.Haskell.TH.Desugar.AST

Show DFamilyResultSig 
Instance details

Defined in Language.Haskell.TH.Desugar.AST

Show DCon 
Instance details

Defined in Language.Haskell.TH.Desugar.AST

Methods

showsPrec :: Int -> DCon -> ShowS #

show :: DCon -> String #

showList :: [DCon] -> ShowS #

Show DConFields 
Instance details

Defined in Language.Haskell.TH.Desugar.AST

Show DForeign 
Instance details

Defined in Language.Haskell.TH.Desugar.AST

Show DPragma 
Instance details

Defined in Language.Haskell.TH.Desugar.AST

Show DRuleBndr 
Instance details

Defined in Language.Haskell.TH.Desugar.AST

Show DTySynEqn 
Instance details

Defined in Language.Haskell.TH.Desugar.AST

Show DInfo 
Instance details

Defined in Language.Haskell.TH.Desugar.AST

Methods

showsPrec :: Int -> DInfo -> ShowS #

show :: DInfo -> String #

showList :: [DInfo] -> ShowS #

Show DDerivClause 
Instance details

Defined in Language.Haskell.TH.Desugar.AST

Show DDerivStrategy 
Instance details

Defined in Language.Haskell.TH.Desugar.AST

Show ZonedTime 
Instance details

Defined in Data.Time.LocalTime.Internal.ZonedTime

Show LocalTime 
Instance details

Defined in Data.Time.LocalTime.Internal.LocalTime

Show UnpackedUUID 
Instance details

Defined in Data.UUID.Types.Internal

Methods

showsPrec :: Int -> UnpackedUUID -> ShowS #

show :: UnpackedUUID -> String #

showList :: [UnpackedUUID] -> ShowS #

Show UUID 
Instance details

Defined in Data.UUID.Types.Internal

Methods

showsPrec :: Int -> UUID -> ShowS #

show :: UUID -> String #

showList :: [UUID] -> ShowS #

Show CodePoint 
Instance details

Defined in Data.Text.Encoding

Methods

showsPrec :: Int -> CodePoint -> ShowS #

show :: CodePoint -> String #

showList :: [CodePoint] -> ShowS #

Show DecoderState 
Instance details

Defined in Data.Text.Encoding

Methods

showsPrec :: Int -> DecoderState -> ShowS #

show :: DecoderState -> String #

showList :: [DecoderState] -> ShowS #

Show ParseChainIdError 
Instance details

Defined in Tezos.Core

Methods

showsPrec :: Int -> ParseChainIdError -> ShowS #

show :: ParseChainIdError -> String #

showList :: [ParseChainIdError] -> ShowS #

Show RefId Source # 
Instance details

Defined in Indigo.Internal.State

Methods

showsPrec :: Int -> RefId -> ShowS #

show :: RefId -> String #

showList :: [RefId] -> ShowS #

Class () (Show a) 
Instance details

Defined in Data.Constraint

Methods

cls :: Show a :- () #

() :=> (Show Bool) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Show Bool #

() :=> (Show Char) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Show Char #

() :=> (Show Int) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Show Int #

() :=> (Show Natural) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Show Natural #

() :=> (Show Ordering) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Show Ordering #

() :=> (Show Word) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Show Word #

() :=> (Show ()) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Show () #

() :=> (Show (Dict a)) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Show (Dict a) #

() :=> (Show (a :- b)) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Show (a :- b) #

Show a => Show [a]

Since: base-2.1

Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> [a] -> ShowS #

show :: [a] -> String #

showList :: [[a]] -> ShowS #

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 #

Show a => Show (Ratio a)

Since: base-2.0.1

Instance details

Defined in GHC.Real

Methods

showsPrec :: Int -> Ratio a -> ShowS #

show :: Ratio a -> String #

showList :: [Ratio a] -> ShowS #

Show (Ptr a)

Since: base-2.1

Instance details

Defined in GHC.Ptr

Methods

showsPrec :: Int -> Ptr a -> ShowS #

show :: Ptr a -> String #

showList :: [Ptr a] -> ShowS #

Show (FunPtr a)

Since: base-2.1

Instance details

Defined in GHC.Ptr

Methods

showsPrec :: Int -> FunPtr a -> ShowS #

show :: FunPtr a -> String #

showList :: [FunPtr a] -> ShowS #

Show p => Show (Par1 p)

Since: base-4.7.0.0

Instance details

Defined in GHC.Generics

Methods

showsPrec :: Int -> Par1 p -> ShowS #

show :: Par1 p -> String #

showList :: [Par1 p] -> ShowS #

Show a => Show (IResult a) 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

showsPrec :: Int -> IResult a -> ShowS #

show :: IResult a -> String #

showList :: [IResult a] -> ShowS #

Show a => Show (Result a) 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

showsPrec :: Int -> Result a -> ShowS #

show :: Result a -> String #

showList :: [Result a] -> ShowS #

Show a => Show (Complex a)

Since: base-2.1

Instance details

Defined in Data.Complex

Methods

showsPrec :: Int -> Complex a -> ShowS #

show :: Complex a -> String #

showList :: [Complex a] -> ShowS #

Show a => Show (Min a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

showsPrec :: Int -> Min a -> ShowS #

show :: Min a -> String #

showList :: [Min a] -> ShowS #

Show a => Show (Max a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

showsPrec :: Int -> Max a -> ShowS #

show :: Max a -> String #

showList :: [Max a] -> ShowS #

Show a => Show (First a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

showsPrec :: Int -> First a -> ShowS #

show :: First a -> String #

showList :: [First a] -> ShowS #

Show a => Show (Last a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

showsPrec :: Int -> Last a -> ShowS #

show :: Last a -> String #

showList :: [Last a] -> ShowS #

Show m => Show (WrappedMonoid m)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Show a => Show (Option a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

showsPrec :: Int -> Option a -> ShowS #

show :: Option a -> String #

showList :: [Option a] -> ShowS #

Show a => Show (ZipList a)

Since: base-4.7.0.0

Instance details

Defined in Control.Applicative

Methods

showsPrec :: Int -> ZipList a -> ShowS #

show :: ZipList a -> String #

showList :: [ZipList a] -> ShowS #

Show a => Show (Identity a)

This instance would be equivalent to the derived instances of the Identity newtype if the runIdentity field were removed

Since: base-4.8.0.0

Instance details

Defined in Data.Functor.Identity

Methods

showsPrec :: Int -> Identity a -> ShowS #

show :: Identity a -> String #

showList :: [Identity a] -> ShowS #

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 #

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 #

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 #

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 #

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 #

Show a => Show (Down a)

Since: base-4.7.0.0

Instance details

Defined in Data.Ord

Methods

showsPrec :: Int -> Down a -> ShowS #

show :: Down a -> String #

showList :: [Down a] -> ShowS #

Show a => Show (NonEmpty a)

Since: base-4.11.0.0

Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> NonEmpty a -> ShowS #

show :: NonEmpty a -> String #

showList :: [NonEmpty a] -> ShowS #

(PrimType ty, Show ty) => Show (UArray ty) 
Instance details

Defined in Basement.UArray.Base

Methods

showsPrec :: Int -> UArray ty -> ShowS #

show :: UArray ty -> String #

showList :: [UArray ty] -> ShowS #

(PrimType ty, Show ty) => Show (Block ty) 
Instance details

Defined in Basement.Block.Base

Methods

showsPrec :: Int -> Block ty -> ShowS #

show :: Block ty -> String #

showList :: [Block ty] -> ShowS #

Show a => Show (NonEmpty a) 
Instance details

Defined in Basement.NonEmpty

Methods

showsPrec :: Int -> NonEmpty a -> ShowS #

show :: NonEmpty a -> String #

showList :: [NonEmpty a] -> ShowS #

Show (Offset ty) 
Instance details

Defined in Basement.Types.OffsetSize

Methods

showsPrec :: Int -> Offset ty -> ShowS #

show :: Offset ty -> String #

showList :: [Offset ty] -> ShowS #

Show (CountOf ty) 
Instance details

Defined in Basement.Types.OffsetSize

Methods

showsPrec :: Int -> CountOf ty -> ShowS #

show :: CountOf ty -> String #

showList :: [CountOf ty] -> ShowS #

Show (Zn64 n) 
Instance details

Defined in Basement.Bounded

Methods

showsPrec :: Int -> Zn64 n -> ShowS #

show :: Zn64 n -> String #

showList :: [Zn64 n] -> ShowS #

Show (Zn n) 
Instance details

Defined in Basement.Bounded

Methods

showsPrec :: Int -> Zn n -> ShowS #

show :: Zn n -> String #

showList :: [Zn n] -> ShowS #

Show (Dict a) 
Instance details

Defined in Data.Constraint

Methods

showsPrec :: Int -> Dict a -> ShowS #

show :: Dict a -> String #

showList :: [Dict a] -> ShowS #

Show a => Show (IntMap a) 
Instance details

Defined in Data.IntMap.Internal

Methods

showsPrec :: Int -> IntMap a -> ShowS #

show :: IntMap a -> String #

showList :: [IntMap a] -> ShowS #

Show a => Show (Tree a) 
Instance details

Defined in Data.Tree

Methods

showsPrec :: Int -> Tree a -> ShowS #

show :: Tree a -> String #

showList :: [Tree a] -> ShowS #

Show a => Show (Seq a) 
Instance details

Defined in Data.Sequence.Internal

Methods

showsPrec :: Int -> Seq a -> ShowS #

show :: Seq a -> String #

showList :: [Seq a] -> ShowS #

Show a => Show (ViewL a) 
Instance details

Defined in Data.Sequence.Internal

Methods

showsPrec :: Int -> ViewL a -> ShowS #

show :: ViewL a -> String #

showList :: [ViewL a] -> ShowS #

Show a => Show (ViewR a) 
Instance details

Defined in Data.Sequence.Internal

Methods

showsPrec :: Int -> ViewR a -> ShowS #

show :: ViewR a -> String #

showList :: [ViewR a] -> ShowS #

Show a => Show (Set a) 
Instance details

Defined in Data.Set.Internal

Methods

showsPrec :: Int -> Set a -> ShowS #

show :: Set a -> String #

showList :: [Set a] -> ShowS #

Show (Blake2s bitlen) 
Instance details

Defined in Crypto.Hash.Blake2

Methods

showsPrec :: Int -> Blake2s bitlen -> ShowS #

show :: Blake2s bitlen -> String #

showList :: [Blake2s bitlen] -> ShowS #

Show (Blake2b bitlen) 
Instance details

Defined in Crypto.Hash.Blake2

Methods

showsPrec :: Int -> Blake2b bitlen -> ShowS #

show :: Blake2b bitlen -> String #

showList :: [Blake2b bitlen] -> ShowS #

Show (Blake2sp bitlen) 
Instance details

Defined in Crypto.Hash.Blake2

Methods

showsPrec :: Int -> Blake2sp bitlen -> ShowS #

show :: Blake2sp bitlen -> String #

showList :: [Blake2sp bitlen] -> ShowS #

Show (Blake2bp bitlen) 
Instance details

Defined in Crypto.Hash.Blake2

Methods

showsPrec :: Int -> Blake2bp bitlen -> ShowS #

show :: Blake2bp bitlen -> String #

showList :: [Blake2bp bitlen] -> ShowS #

Show (SHAKE128 bitlen) 
Instance details

Defined in Crypto.Hash.SHAKE

Methods

showsPrec :: Int -> SHAKE128 bitlen -> ShowS #

show :: SHAKE128 bitlen -> String #

showList :: [SHAKE128 bitlen] -> ShowS #

Show (SHAKE256 bitlen) 
Instance details

Defined in Crypto.Hash.SHAKE

Methods

showsPrec :: Int -> SHAKE256 bitlen -> ShowS #

show :: SHAKE256 bitlen -> String #

showList :: [SHAKE256 bitlen] -> ShowS #

Show a => Show (CryptoFailable a) 
Instance details

Defined in Crypto.Error.Types

Show a => Show (DList a) 
Instance details

Defined in Data.DList

Methods

showsPrec :: Int -> DList a -> ShowS #

show :: DList a -> String #

showList :: [DList a] -> ShowS #

Show a => Show (ExitCase a) 
Instance details

Defined in Control.Monad.Catch

Methods

showsPrec :: Int -> ExitCase a -> ShowS #

show :: ExitCase a -> String #

showList :: [ExitCase a] -> ShowS #

Show a => Show (Hashed a) 
Instance details

Defined in Data.Hashable.Class

Methods

showsPrec :: Int -> Hashed a -> ShowS #

show :: Hashed a -> String #

showList :: [Hashed a] -> ShowS #

Show l => Show (PragmasAndModuleName l) 
Instance details

Defined in Language.Haskell.Exts.Parser

Show l => Show (PragmasAndModuleHead l) 
Instance details

Defined in Language.Haskell.Exts.Parser

Show l => Show (ModuleHeadAndImports l) 
Instance details

Defined in Language.Haskell.Exts.Parser

Show a => Show (NonGreedy a) 
Instance details

Defined in Language.Haskell.Exts.Parser

Show a => Show (ListOf a) 
Instance details

Defined in Language.Haskell.Exts.Parser

Methods

showsPrec :: Int -> ListOf a -> ShowS #

show :: ListOf a -> String #

showList :: [ListOf a] -> ShowS #

Show l => Show (ModuleName l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Show l => Show (SpecialCon l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Show l => Show (QName l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> QName l -> ShowS #

show :: QName l -> String #

showList :: [QName l] -> ShowS #

Show l => Show (Name l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> Name l -> ShowS #

show :: Name l -> String #

showList :: [Name l] -> ShowS #

Show l => Show (IPName l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> IPName l -> ShowS #

show :: IPName l -> String #

showList :: [IPName l] -> ShowS #

Show l => Show (QOp l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> QOp l -> ShowS #

show :: QOp l -> String #

showList :: [QOp l] -> ShowS #

Show l => Show (Op l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> Op l -> ShowS #

show :: Op l -> String #

showList :: [Op l] -> ShowS #

Show l => Show (CName l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> CName l -> ShowS #

show :: CName l -> String #

showList :: [CName l] -> ShowS #

Show l => Show (Module l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> Module l -> ShowS #

show :: Module l -> String #

showList :: [Module l] -> ShowS #

Show l => Show (ModuleHead l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Show l => Show (ExportSpecList l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Show l => Show (ExportSpec l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Show l => Show (EWildcard l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Show l => Show (Namespace l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Show l => Show (ImportDecl l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Show l => Show (ImportSpecList l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Show l => Show (ImportSpec l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Show l => Show (Assoc l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> Assoc l -> ShowS #

show :: Assoc l -> String #

showList :: [Assoc l] -> ShowS #

Show l => Show (Decl l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> Decl l -> ShowS #

show :: Decl l -> String #

showList :: [Decl l] -> ShowS #

Show l => Show (PatternSynDirection l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Show l => Show (TypeEqn l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> TypeEqn l -> ShowS #

show :: TypeEqn l -> String #

showList :: [TypeEqn l] -> ShowS #

Show l => Show (Annotation l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Show l => Show (BooleanFormula l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Show l => Show (Role l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> Role l -> ShowS #

show :: Role l -> String #

showList :: [Role l] -> ShowS #

Show l => Show (DataOrNew l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Show l => Show (InjectivityInfo l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Show l => Show (ResultSig l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Show l => Show (DeclHead l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> DeclHead l -> ShowS #

show :: DeclHead l -> String #

showList :: [DeclHead l] -> ShowS #

Show l => Show (InstRule l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> InstRule l -> ShowS #

show :: InstRule l -> String #

showList :: [InstRule l] -> ShowS #

Show l => Show (InstHead l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> InstHead l -> ShowS #

show :: InstHead l -> String #

showList :: [InstHead l] -> ShowS #

Show l => Show (Deriving l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> Deriving l -> ShowS #

show :: Deriving l -> String #

showList :: [Deriving l] -> ShowS #

Show l => Show (DerivStrategy l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Show l => Show (Binds l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> Binds l -> ShowS #

show :: Binds l -> String #

showList :: [Binds l] -> ShowS #

Show l => Show (IPBind l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> IPBind l -> ShowS #

show :: IPBind l -> String #

showList :: [IPBind l] -> ShowS #

Show l => Show (Match l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> Match l -> ShowS #

show :: Match l -> String #

showList :: [Match l] -> ShowS #

Show l => Show (QualConDecl l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Show l => Show (ConDecl l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> ConDecl l -> ShowS #

show :: ConDecl l -> String #

showList :: [ConDecl l] -> ShowS #

Show l => Show (FieldDecl l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Show l => Show (GadtDecl l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> GadtDecl l -> ShowS #

show :: GadtDecl l -> String #

showList :: [GadtDecl l] -> ShowS #

Show l => Show (ClassDecl l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Show l => Show (InstDecl l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> InstDecl l -> ShowS #

show :: InstDecl l -> String #

showList :: [InstDecl l] -> ShowS #

Show l => Show (BangType l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> BangType l -> ShowS #

show :: BangType l -> String #

showList :: [BangType l] -> ShowS #

Show l => Show (Unpackedness l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Show l => Show (Rhs l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> Rhs l -> ShowS #

show :: Rhs l -> String #

showList :: [Rhs l] -> ShowS #

Show l => Show (GuardedRhs l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Show l => Show (Type l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> Type l -> ShowS #

show :: Type l -> String #

showList :: [Type l] -> ShowS #

Show l => Show (MaybePromotedName l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Show l => Show (Promoted l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> Promoted l -> ShowS #

show :: Promoted l -> String #

showList :: [Promoted l] -> ShowS #

Show l => Show (TyVarBind l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Show l => Show (FunDep l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> FunDep l -> ShowS #

show :: FunDep l -> String #

showList :: [FunDep l] -> ShowS #

Show l => Show (Context l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> Context l -> ShowS #

show :: Context l -> String #

showList :: [Context l] -> ShowS #

Show l => Show (Asst l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> Asst l -> ShowS #

show :: Asst l -> String #

showList :: [Asst l] -> ShowS #

Show l => Show (Literal l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> Literal l -> ShowS #

show :: Literal l -> String #

showList :: [Literal l] -> ShowS #

Show l => Show (Sign l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> Sign l -> ShowS #

show :: Sign l -> String #

showList :: [Sign l] -> ShowS #

Show l => Show (Exp l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> Exp l -> ShowS #

show :: Exp l -> String #

showList :: [Exp l] -> ShowS #

Show l => Show (XName l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> XName l -> ShowS #

show :: XName l -> String #

showList :: [XName l] -> ShowS #

Show l => Show (XAttr l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> XAttr l -> ShowS #

show :: XAttr l -> String #

showList :: [XAttr l] -> ShowS #

Show l => Show (Bracket l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> Bracket l -> ShowS #

show :: Bracket l -> String #

showList :: [Bracket l] -> ShowS #

Show l => Show (Splice l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> Splice l -> ShowS #

show :: Splice l -> String #

showList :: [Splice l] -> ShowS #

Show l => Show (Safety l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> Safety l -> ShowS #

show :: Safety l -> String #

showList :: [Safety l] -> ShowS #

Show l => Show (CallConv l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> CallConv l -> ShowS #

show :: CallConv l -> String #

showList :: [CallConv l] -> ShowS #

Show l => Show (ModulePragma l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Show l => Show (Overlap l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> Overlap l -> ShowS #

show :: Overlap l -> String #

showList :: [Overlap l] -> ShowS #

Show l => Show (Activation l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Show l => Show (Rule l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> Rule l -> ShowS #

show :: Rule l -> String #

showList :: [Rule l] -> ShowS #

Show l => Show (RuleVar l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> RuleVar l -> ShowS #

show :: RuleVar l -> String #

showList :: [RuleVar l] -> ShowS #

Show l => Show (WarningText l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Show l => Show (Pat l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> Pat l -> ShowS #

show :: Pat l -> String #

showList :: [Pat l] -> ShowS #

Show l => Show (PXAttr l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> PXAttr l -> ShowS #

show :: PXAttr l -> String #

showList :: [PXAttr l] -> ShowS #

Show l => Show (RPatOp l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> RPatOp l -> ShowS #

show :: RPatOp l -> String #

showList :: [RPatOp l] -> ShowS #

Show l => Show (RPat l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> RPat l -> ShowS #

show :: RPat l -> String #

showList :: [RPat l] -> ShowS #

Show l => Show (PatField l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> PatField l -> ShowS #

show :: PatField l -> String #

showList :: [PatField l] -> ShowS #

Show l => Show (Stmt l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> Stmt l -> ShowS #

show :: Stmt l -> String #

showList :: [Stmt l] -> ShowS #

Show l => Show (QualStmt l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> QualStmt l -> ShowS #

show :: QualStmt l -> String #

showList :: [QualStmt l] -> ShowS #

Show l => Show (FieldUpdate l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Show l => Show (Alt l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> Alt l -> ShowS #

show :: Alt l -> String #

showList :: [Alt l] -> ShowS #

Show a => Show (Loc a) 
Instance details

Defined in Language.Haskell.Exts.SrcLoc

Methods

showsPrec :: Int -> Loc a -> ShowS #

show :: Loc a -> String #

showList :: [Loc a] -> ShowS #

(Show a, Prim a) => Show (Vector a) 
Instance details

Defined in Data.Vector.Primitive

Methods

showsPrec :: Int -> Vector a -> ShowS #

show :: Vector a -> String #

showList :: [Vector a] -> ShowS #

(Show a, Storable a) => Show (Vector a) 
Instance details

Defined in Data.Vector.Storable

Methods

showsPrec :: Int -> Vector a -> ShowS #

show :: Vector a -> String #

showList :: [Vector a] -> ShowS #

Show a => Show (HashSet a) 
Instance details

Defined in Data.HashSet.Base

Methods

showsPrec :: Int -> HashSet a -> ShowS #

show :: HashSet a -> String #

showList :: [HashSet a] -> ShowS #

Show a => Show (Vector a) 
Instance details

Defined in Data.Vector

Methods

showsPrec :: Int -> Vector a -> ShowS #

show :: Vector a -> String #

showList :: [Vector a] -> ShowS #

Show (Notes t) 
Instance details

Defined in Michelson.Typed.Annotation

Methods

showsPrec :: Int -> Notes t -> ShowS #

show :: Notes t -> String #

showList :: [Notes t] -> ShowS #

Show (UParam entries) 
Instance details

Defined in Lorentz.UParam

Methods

showsPrec :: Int -> UParam entries -> ShowS #

show :: UParam entries -> String #

showList :: [UParam entries] -> ShowS #

Show (ConstrainedSome Show) 
Instance details

Defined in Lorentz.UParam

Show (UStore a) 
Instance details

Defined in Lorentz.UStore.Types

Methods

showsPrec :: Int -> UStore a -> ShowS #

show :: UStore a -> String #

showList :: [UStore a] -> ShowS #

Show (ErrorArg tag) => Show (CustomError tag) 
Instance details

Defined in Lorentz.Errors

Methods

showsPrec :: Int -> CustomError tag -> ShowS #

show :: CustomError tag -> String #

showList :: [CustomError tag] -> ShowS #

Show (EpCallingDesc info) 
Instance details

Defined in Lorentz.EntryPoints.Core

Methods

showsPrec :: Int -> EpCallingDesc info -> ShowS #

show :: EpCallingDesc info -> String #

showList :: [EpCallingDesc info] -> ShowS #

Show (Label name) 
Instance details

Defined in Util.Label

Methods

showsPrec :: Int -> Label name -> ShowS #

show :: Label name -> String #

showList :: [Label name] -> ShowS #

Show (ContractRef arg) 
Instance details

Defined in Michelson.Typed.Haskell.Value

Methods

showsPrec :: Int -> ContractRef arg -> ShowS #

show :: ContractRef arg -> String #

showList :: [ContractRef arg] -> ShowS #

Show t => Show (ErrorItem t) 
Instance details

Defined in Text.Megaparsec.Error

Show e => Show (ErrorFancy e) 
Instance details

Defined in Text.Megaparsec.Error

Show s => Show (PosState s) 
Instance details

Defined in Text.Megaparsec.State

Methods

showsPrec :: Int -> PosState s -> ShowS #

show :: PosState s -> String #

showList :: [PosState s] -> ShowS #

Show (HST ts) 
Instance details

Defined in Michelson.TypeCheck.Types

Methods

showsPrec :: Int -> HST ts -> ShowS #

show :: HST ts -> String #

showList :: [HST ts] -> ShowS #

Show (ExtInstr inp) => Show (SomeInstrOut inp) 
Instance details

Defined in Michelson.TypeCheck.Types

Show (ExtInstr inp) => Show (SomeInstr inp) 
Instance details

Defined in Michelson.TypeCheck.Types

Methods

showsPrec :: Int -> SomeInstr inp -> ShowS #

show :: SomeInstr inp -> String #

showList :: [SomeInstr inp] -> ShowS #

Show (PackedNotes a) 
Instance details

Defined in Michelson.Typed.Instr

Show (TestAssert s) 
Instance details

Defined in Michelson.Typed.Instr

Show (StackRef st) 
Instance details

Defined in Michelson.Typed.Instr

Methods

showsPrec :: Int -> StackRef st -> ShowS #

show :: StackRef st -> String #

showList :: [StackRef st] -> ShowS #

Show (PrintComment st) 
Instance details

Defined in Michelson.Typed.Instr

Show (ExtInstr s) 
Instance details

Defined in Michelson.Typed.Instr

Methods

showsPrec :: Int -> ExtInstr s -> ShowS #

show :: ExtInstr s -> String #

showList :: [ExtInstr s] -> ShowS #

Show (Operation' instr) 
Instance details

Defined in Michelson.Typed.Value

Methods

showsPrec :: Int -> Operation' instr -> ShowS #

show :: Operation' instr -> String #

showList :: [Operation' instr] -> ShowS #

Show (SomeValue' instr) 
Instance details

Defined in Michelson.Typed.Value

Methods

showsPrec :: Int -> SomeValue' instr -> ShowS #

show :: SomeValue' instr -> String #

showList :: [SomeValue' instr] -> ShowS #

Show (SomeEntryPointCallT arg) 
Instance details

Defined in Michelson.Typed.EntryPoints

Show (ParamNotes t) 
Instance details

Defined in Michelson.Typed.EntryPoints

RenderDoc (InstrAbstract op) => Show (InstrAbstract op) 
Instance details

Defined in Michelson.Untyped.Instr

Show op => Show (Value' op) 
Instance details

Defined in Michelson.Untyped.Value

Methods

showsPrec :: Int -> Value' op -> ShowS #

show :: Value' op -> String #

showList :: [Value' op] -> ShowS #

Show op => Show (Elt op) 
Instance details

Defined in Michelson.Untyped.Value

Methods

showsPrec :: Int -> Elt op -> ShowS #

show :: Elt op -> String #

showList :: [Elt op] -> ShowS #

Show (SingNat n) 
Instance details

Defined in Util.Peano

Methods

showsPrec :: Int -> SingNat n -> ShowS #

show :: SingNat n -> String #

showList :: [SingNat n] -> ShowS #

Show op => Show (ContractBlock op) 
Instance details

Defined in Michelson.Untyped.Contract

Show op => Show (Contract' op) 
Instance details

Defined in Michelson.Untyped.Contract

Methods

showsPrec :: Int -> Contract' op -> ShowS #

show :: Contract' op -> String #

showList :: [Contract' op] -> ShowS #

Show op => Show (ExtInstrAbstract op) 
Instance details

Defined in Michelson.Untyped.Ext

Show op => Show (TestAssert op) 
Instance details

Defined in Michelson.Untyped.Ext

Methods

showsPrec :: Int -> TestAssert op -> ShowS #

show :: TestAssert op -> String #

showList :: [TestAssert op] -> ShowS #

Show (Doc a) 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Methods

showsPrec :: Int -> Doc a -> ShowS #

show :: Doc a -> String #

showList :: [Doc a] -> ShowS #

Show a => Show (AnnotDetails a) 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Show a => Show (Span a) 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Methods

showsPrec :: Int -> Span a -> ShowS #

show :: Span a -> String #

showList :: [Span a] -> ShowS #

(Show a, Prim a) => Show (PrimArray a)

Since: primitive-0.6.4.0

Instance details

Defined in Data.Primitive.PrimArray

Show a => Show (SmallArray a) 
Instance details

Defined in Data.Primitive.SmallArray

Show a => Show (Array a) 
Instance details

Defined in Data.Primitive.Array

Methods

showsPrec :: Int -> Array a -> ShowS #

show :: Array a -> String #

showList :: [Array a] -> ShowS #

Show a => Show (Identity a) 
Instance details

Defined in Data.Vinyl.Functor

Methods

showsPrec :: Int -> Identity a -> ShowS #

show :: Identity a -> String #

showList :: [Identity a] -> ShowS #

Show a => Show (Thunk a) 
Instance details

Defined in Data.Vinyl.Functor

Methods

showsPrec :: Int -> Thunk a -> ShowS #

show :: Thunk a -> String #

showList :: [Thunk a] -> ShowS #

(Show t, KnownSymbol s) => Show (ElField '(s, t)) 
Instance details

Defined in Data.Vinyl.Functor

Methods

showsPrec :: Int -> ElField '(s, t) -> ShowS #

show :: ElField '(s, t) -> String #

showList :: [ElField '(s, t)] -> ShowS #

(Show a) :=> (Show (Complex a)) 
Instance details

Defined in Data.Constraint

Methods

ins :: Show a :- Show (Complex a) #

(Show a) :=> (Show [a]) 
Instance details

Defined in Data.Constraint

Methods

ins :: Show a :- Show [a] #

(Show a) :=> (Show (Maybe a)) 
Instance details

Defined in Data.Constraint

Methods

ins :: Show a :- Show (Maybe a) #

(Show a) :=> (Show (Identity a)) 
Instance details

Defined in Data.Constraint

Methods

ins :: Show a :- Show (Identity a) #

(Show a) :=> (Show (Const a b)) 
Instance details

Defined in Data.Constraint

Methods

ins :: Show a :- Show (Const a b) #

Show (ErrorArg tag) => Show (() -> CustomError tag) 
Instance details

Defined in Lorentz.Errors

Methods

showsPrec :: Int -> (() -> CustomError tag) -> ShowS #

show :: (() -> CustomError tag) -> String #

showList :: [() -> CustomError tag] -> ShowS #

(Show a, Show b) => Show (Either a b)

Since: base-3.0

Instance details

Defined in Data.Either

Methods

showsPrec :: Int -> Either a b -> ShowS #

show :: Either a b -> String #

showList :: [Either a b] -> ShowS #

Show (V1 p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

showsPrec :: Int -> V1 p -> ShowS #

show :: V1 p -> String #

showList :: [V1 p] -> ShowS #

Show (U1 p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

showsPrec :: Int -> U1 p -> ShowS #

show :: U1 p -> String #

showList :: [U1 p] -> ShowS #

Show (TypeRep a) 
Instance details

Defined in Data.Typeable.Internal

Methods

showsPrec :: Int -> TypeRep a -> ShowS #

show :: TypeRep a -> String #

showList :: [TypeRep a] -> ShowS #

(Show a, Show b) => Show (a, b)

Since: base-2.1

Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> (a, b) -> ShowS #

show :: (a, b) -> String #

showList :: [(a, b)] -> ShowS #

(Show k, Show v) => Show (HashMap k v) 
Instance details

Defined in Data.HashMap.Base

Methods

showsPrec :: Int -> HashMap k v -> ShowS #

show :: HashMap k v -> String #

showList :: [HashMap k v] -> ShowS #

(Show k, Show a) => Show (Map k a) 
Instance details

Defined in Data.Map.Internal

Methods

showsPrec :: Int -> Map k a -> ShowS #

show :: Map k a -> String #

showList :: [Map k a] -> ShowS #

(Show i, Show r) => Show (IResult i r) 
Instance details

Defined in Data.Attoparsec.Internal.Types

Methods

showsPrec :: Int -> IResult i r -> ShowS #

show :: IResult i r -> String #

showList :: [IResult i r] -> ShowS #

(Show a, Show b) => Show (Arg a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

showsPrec :: Int -> Arg a b -> ShowS #

show :: Arg a b -> String #

showList :: [Arg a b] -> ShowS #

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 #

(Show a, Show b) => Show (Bimap a b) 
Instance details

Defined in Data.Bimap

Methods

showsPrec :: Int -> Bimap a b -> ShowS #

show :: Bimap a b -> String #

showList :: [Bimap a b] -> ShowS #

Show (a :- b) 
Instance details

Defined in Data.Constraint

Methods

showsPrec :: Int -> (a :- b) -> ShowS #

show :: (a :- b) -> String #

showList :: [a :- b] -> ShowS #

(Show1 m, Show a) => Show (MaybeT m a) 
Instance details

Defined in Control.Monad.Trans.Maybe

Methods

showsPrec :: Int -> MaybeT m a -> ShowS #

show :: MaybeT m a -> String #

showList :: [MaybeT m a] -> ShowS #

(Show1 f, Show a) => Show (Cofree f a) 
Instance details

Defined in Control.Comonad.Cofree

Methods

showsPrec :: Int -> Cofree f a -> ShowS #

show :: Cofree f a -> String #

showList :: [Cofree f a] -> ShowS #

(Show1 f, Show a) => Show (Free f a) 
Instance details

Defined in Control.Monad.Free

Methods

showsPrec :: Int -> Free f a -> ShowS #

show :: Free f a -> String #

showList :: [Free f a] -> ShowS #

Show (f a) => Show (Yoneda f a) 
Instance details

Defined in Data.Functor.Yoneda

Methods

showsPrec :: Int -> Yoneda f a -> ShowS #

show :: Yoneda f a -> String #

showList :: [Yoneda f a] -> ShowS #

Show a => Show (View a r) 
Instance details

Defined in Lorentz.Macro

Methods

showsPrec :: Int -> View a r -> ShowS #

show :: View a r -> String #

showList :: [View a r] -> ShowS #

Show a => Show (Void_ a b) 
Instance details

Defined in Lorentz.Macro

Methods

showsPrec :: Int -> Void_ a b -> ShowS #

show :: Void_ a b -> String #

showList :: [Void_ a b] -> ShowS #

Show (MigrationScript oldStore newStore) 
Instance details

Defined in Lorentz.UStore.Migration.Base

Methods

showsPrec :: Int -> MigrationScript oldStore newStore -> ShowS #

show :: MigrationScript oldStore newStore -> String #

showList :: [MigrationScript oldStore newStore] -> ShowS #

(Show k, Show v) => Show (k |~> v) 
Instance details

Defined in Lorentz.UStore.Types

Methods

showsPrec :: Int -> (k |~> v) -> ShowS #

show :: (k |~> v) -> String #

showList :: [k |~> v] -> ShowS #

Show v => Show (UStoreFieldExt m v) 
Instance details

Defined in Lorentz.UStore.Types

Show (inp :-> out) 
Instance details

Defined in Lorentz.Base

Methods

showsPrec :: Int -> (inp :-> out) -> ShowS #

show :: (inp :-> out) -> String #

showList :: [inp :-> out] -> ShowS #

(Show k, Show v) => Show (BigMap k v) 
Instance details

Defined in Michelson.Typed.Haskell.Value

Methods

showsPrec :: Int -> BigMap k v -> ShowS #

show :: BigMap k v -> String #

showList :: [BigMap k v] -> ShowS #

(Show s, Show (Token s), Show e) => Show (ParseErrorBundle s e) 
Instance details

Defined in Text.Megaparsec.Error

(Show (ParseError s e), Show s) => Show (State s e) 
Instance details

Defined in Text.Megaparsec.State

Methods

showsPrec :: Int -> State s e -> ShowS #

show :: State s e -> String #

showList :: [State s e] -> ShowS #

(Show (Token s), Show e) => Show (ParseError s e) 
Instance details

Defined in Text.Megaparsec.Error

Methods

showsPrec :: Int -> ParseError s e -> ShowS #

show :: ParseError s e -> String #

showList :: [ParseError s e] -> ShowS #

Show (Instr inp out) 
Instance details

Defined in Michelson.Typed.Instr

Methods

showsPrec :: Int -> Instr inp out -> ShowS #

show :: Instr inp out -> String #

showList :: [Instr inp out] -> ShowS #

Show (Contract cp st) 
Instance details

Defined in Michelson.Typed.Instr

Methods

showsPrec :: Int -> Contract cp st -> ShowS #

show :: Contract cp st -> String #

showList :: [Contract cp st] -> ShowS #

(Show n, Show m) => Show (ArithError n m) 
Instance details

Defined in Michelson.Typed.Arith

Methods

showsPrec :: Int -> ArithError n m -> ShowS #

show :: ArithError n m -> String #

showList :: [ArithError n m] -> ShowS #

Show (TransferTokens instr p) 
Instance details

Defined in Michelson.Typed.Value

Methods

showsPrec :: Int -> TransferTokens instr p -> ShowS #

show :: TransferTokens instr p -> String #

showList :: [TransferTokens instr p] -> ShowS #

Show (Value' instr t) 
Instance details

Defined in Michelson.Typed.Value

Methods

showsPrec :: Int -> Value' instr t -> ShowS #

show :: Value' instr t -> String #

showList :: [Value' instr t] -> ShowS #

Show (SomeConstrainedValue' instr c) 
Instance details

Defined in Michelson.Typed.Value

Show (EntryPointCallT param arg) 
Instance details

Defined in Michelson.Typed.EntryPoints

Methods

showsPrec :: Int -> EntryPointCallT param arg -> ShowS #

show :: EntryPointCallT param arg -> String #

showList :: [EntryPointCallT param arg] -> ShowS #

Show (EpLiftSequence arg param) 
Instance details

Defined in Michelson.Typed.EntryPoints

Methods

showsPrec :: Int -> EpLiftSequence arg param -> ShowS #

show :: EpLiftSequence arg param -> String #

showList :: [EpLiftSequence arg param] -> ShowS #

(forall (a :: k). Show (f a)) => Show (Some1 f) 
Instance details

Defined in Util.Type

Methods

showsPrec :: Int -> Some1 f -> ShowS #

show :: Some1 f -> String #

showList :: [Some1 f] -> ShowS #

KnownAnnTag tag => Show (Annotation tag) 
Instance details

Defined in Michelson.Untyped.Annotation

Methods

showsPrec :: Int -> Annotation tag -> ShowS #

show :: Annotation tag -> String #

showList :: [Annotation tag] -> ShowS #

ShowSing (Maybe a) => Show (SFirst z) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

Methods

showsPrec :: Int -> SFirst z -> ShowS #

show :: SFirst z -> String #

showList :: [SFirst z] -> ShowS #

ShowSing (Maybe a) => Show (SLast z) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

Methods

showsPrec :: Int -> SLast z -> ShowS #

show :: SLast z -> String #

showList :: [SLast z] -> ShowS #

(Integral a, Show a) :=> (Show (Ratio a)) 
Instance details

Defined in Data.Constraint

Methods

ins :: (Integral a, Show a) :- Show (Ratio a) #

(Show a, Show b) :=> (Show (a, b)) 
Instance details

Defined in Data.Constraint

Methods

ins :: (Show a, Show b) :- Show (a, b) #

(Show a, Show b) :=> (Show (Either a b)) 
Instance details

Defined in Data.Constraint

Methods

ins :: (Show a, Show b) :- Show (Either a b) #

Show (f p) => Show (Rec1 f p)

Since: base-4.7.0.0

Instance details

Defined in GHC.Generics

Methods

showsPrec :: Int -> Rec1 f p -> ShowS #

show :: Rec1 f p -> String #

showList :: [Rec1 f p] -> ShowS #

Show (URec Char p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

showsPrec :: Int -> URec Char p -> ShowS #

show :: URec Char p -> String #

showList :: [URec Char p] -> ShowS #

Show (URec Double p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

showsPrec :: Int -> URec Double p -> ShowS #

show :: URec Double p -> String #

showList :: [URec Double p] -> ShowS #

Show (URec Float p) 
Instance details

Defined in GHC.Generics

Methods

showsPrec :: Int -> URec Float p -> ShowS #

show :: URec Float p -> String #

showList :: [URec Float p] -> ShowS #

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 #

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 #

(Show a, Show b, Show c) => Show (a, b, c)

Since: base-2.1

Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> (a, b, c) -> ShowS #

show :: (a, b, c) -> String #

showList :: [(a, b, c)] -> ShowS #

Show a => Show (Const a b)

This instance would be equivalent to the derived instances of the Const newtype if the getConst field were removed

Since: base-4.8.0.0

Instance details

Defined in Data.Functor.Const

Methods

showsPrec :: Int -> Const a b -> ShowS #

show :: Const a b -> String #

showList :: [Const a b] -> ShowS #

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 #

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 #

Show (Coercion a b)

Since: base-4.7.0.0

Instance details

Defined in Data.Type.Coercion

Methods

showsPrec :: Int -> Coercion a b -> ShowS #

show :: Coercion a b -> String #

showList :: [Coercion a b] -> ShowS #

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 #

Show (p a a) => Show (Join p a) 
Instance details

Defined in Data.Bifunctor.Join

Methods

showsPrec :: Int -> Join p a -> ShowS #

show :: Join p a -> String #

showList :: [Join p a] -> ShowS #

Show (p (Fix p a) a) => Show (Fix p a) 
Instance details

Defined in Data.Bifunctor.Fix

Methods

showsPrec :: Int -> Fix p a -> ShowS #

show :: Fix p a -> String #

showList :: [Fix p a] -> ShowS #

(Show1 f, Show a) => Show (IdentityT f a) 
Instance details

Defined in Control.Monad.Trans.Identity

Methods

showsPrec :: Int -> IdentityT f a -> ShowS #

show :: IdentityT f a -> String #

showList :: [IdentityT f a] -> ShowS #

(Show e, Show1 m, Show a) => Show (ExceptT e m a) 
Instance details

Defined in Control.Monad.Trans.Except

Methods

showsPrec :: Int -> ExceptT e m a -> ShowS #

show :: ExceptT e m a -> String #

showList :: [ExceptT e m a] -> ShowS #

(Show a, Show (f b)) => Show (FreeF f a b) 
Instance details

Defined in Control.Monad.Trans.Free

Methods

showsPrec :: Int -> FreeF f a b -> ShowS #

show :: FreeF f a b -> String #

showList :: [FreeF f a b] -> ShowS #

(Show1 f, Show1 m, Show a) => Show (FreeT f m a) 
Instance details

Defined in Control.Monad.Trans.Free

Methods

showsPrec :: Int -> FreeT f m a -> ShowS #

show :: FreeT f m a -> String #

showList :: [FreeT f m a] -> ShowS #

(Show a, Show (f b)) => Show (CofreeF f a b) 
Instance details

Defined in Control.Comonad.Trans.Cofree

Methods

showsPrec :: Int -> CofreeF f a b -> ShowS #

show :: CofreeF f a b -> String #

showList :: [CofreeF f a b] -> ShowS #

Show (w (CofreeF f a (CofreeT f w a))) => Show (CofreeT f w a) 
Instance details

Defined in Control.Comonad.Trans.Cofree

Methods

showsPrec :: Int -> CofreeT f w a -> ShowS #

show :: CofreeT f w a -> String #

showList :: [CofreeT f w a] -> ShowS #

(Show e, Show1 m, Show a) => Show (ErrorT e m a) 
Instance details

Defined in Control.Monad.Trans.Error

Methods

showsPrec :: Int -> ErrorT e m a -> ShowS #

show :: ErrorT e m a -> String #

showList :: [ErrorT e m a] -> ShowS #

(RMap rs, ReifyConstraint Show f rs, RecordToList rs) => Show (Rec f rs)

Records may be shown insofar as their points may be shown. reifyConstraint is used to great effect here.

Instance details

Defined in Data.Vinyl.Core

Methods

showsPrec :: Int -> Rec f rs -> ShowS #

show :: Rec f rs -> String #

showList :: [Rec f rs] -> ShowS #

Show (CreateContract instr cp st) 
Instance details

Defined in Michelson.Typed.Value

Methods

showsPrec :: Int -> CreateContract instr cp st -> ShowS #

show :: CreateContract instr cp st -> String #

showList :: [CreateContract instr cp st] -> ShowS #

(ShowSing a, ShowSing b) => Show (SArg z) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

Methods

showsPrec :: Int -> SArg z -> ShowS #

show :: SArg z -> String #

showList :: [SArg z] -> ShowS #

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 #

(RPureConstrained (IndexableField rs) rs, RecApplicative rs, Show (Rec f rs)) => Show (ARec f rs) 
Instance details

Defined in Data.Vinyl.ARec

Methods

showsPrec :: Int -> ARec f rs -> ShowS #

show :: ARec f rs -> String #

showList :: [ARec f rs] -> ShowS #

Show a => Show (Const a b) 
Instance details

Defined in Data.Vinyl.Functor

Methods

showsPrec :: Int -> Const a b -> ShowS #

show :: Const a b -> String #

showList :: [Const a b] -> ShowS #

Show c => Show (K1 i c p)

Since: base-4.7.0.0

Instance details

Defined in GHC.Generics

Methods

showsPrec :: Int -> K1 i c p -> ShowS #

show :: K1 i c p -> String #

showList :: [K1 i c p] -> ShowS #

(Show (f p), Show (g p)) => Show ((f :+: g) p)

Since: base-4.7.0.0

Instance details

Defined in GHC.Generics

Methods

showsPrec :: Int -> (f :+: g) p -> ShowS #

show :: (f :+: g) p -> String #

showList :: [(f :+: g) p] -> ShowS #

(Show (f p), Show (g p)) => Show ((f :*: g) p)

Since: base-4.7.0.0

Instance details

Defined in GHC.Generics

Methods

showsPrec :: Int -> (f :*: g) p -> ShowS #

show :: (f :*: g) p -> String #

showList :: [(f :*: g) p] -> ShowS #

(Show a, Show b, Show c, Show d) => Show (a, b, c, d)

Since: base-2.1

Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> (a, b, c, d) -> ShowS #

show :: (a, b, c, d) -> String #

showList :: [(a, b, c, d)] -> ShowS #

(Show1 f, Show1 g, Show a) => Show (Product f g a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Product

Methods

showsPrec :: Int -> Product f g a -> ShowS #

show :: Product f g a -> String #

showList :: [Product f g a] -> ShowS #

(Show1 f, Show1 g, Show a) => Show (Sum f g a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Sum

Methods

showsPrec :: Int -> Sum f g a -> ShowS #

show :: Sum f g a -> String #

showList :: [Sum f g a] -> ShowS #

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 #

(forall (o' :: k). Show (instr i o')) => Show (RemFail instr i o) 
Instance details

Defined in Michelson.Typed.Value

Methods

showsPrec :: Int -> RemFail instr i o -> ShowS #

show :: RemFail instr i o -> String #

showList :: [RemFail instr i o] -> ShowS #

Show (f p) => Show (M1 i c f p)

Since: base-4.7.0.0

Instance details

Defined in GHC.Generics

Methods

showsPrec :: Int -> M1 i c f p -> ShowS #

show :: M1 i c f p -> String #

showList :: [M1 i c f p] -> ShowS #

Show (f (g p)) => Show ((f :.: g) p)

Since: base-4.7.0.0

Instance details

Defined in GHC.Generics

Methods

showsPrec :: Int -> (f :.: g) p -> ShowS #

show :: (f :.: g) p -> String #

showList :: [(f :.: g) p] -> ShowS #

(Show a, Show b, Show c, Show d, Show e) => Show (a, b, c, d, e)

Since: base-2.1

Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> (a, b, c, d, e) -> ShowS #

show :: (a, b, c, d, e) -> String #

showList :: [(a, b, c, d, e)] -> ShowS #

(Show1 f, Show1 g, Show a) => Show (Compose f g a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Compose

Methods

showsPrec :: Int -> Compose f g a -> ShowS #

show :: Compose f g a -> String #

showList :: [Compose f g a] -> ShowS #

Show (p a b) => Show (WrappedBifunctor p a b) 
Instance details

Defined in Data.Bifunctor.Wrapped

Show (g b) => Show (Joker g a b) 
Instance details

Defined in Data.Bifunctor.Joker

Methods

showsPrec :: Int -> Joker g a b -> ShowS #

show :: Joker g a b -> String #

showList :: [Joker g a b] -> ShowS #

Show (p b a) => Show (Flip p a b) 
Instance details

Defined in Data.Bifunctor.Flip

Methods

showsPrec :: Int -> Flip p a b -> ShowS #

show :: Flip p a b -> String #

showList :: [Flip p a b] -> ShowS #

Show (f a) => Show (Clown f a b) 
Instance details

Defined in Data.Bifunctor.Clown

Methods

showsPrec :: Int -> Clown f a b -> ShowS #

show :: Clown f a b -> String #

showList :: [Clown f a b] -> ShowS #

Show (f (g a)) => Show (Compose f g a) 
Instance details

Defined in Data.Vinyl.Functor

Methods

showsPrec :: Int -> Compose f g a -> ShowS #

show :: Compose f g a -> String #

showList :: [Compose f g a] -> ShowS #

(Show a, Show b, Show c, Show d, Show e, Show f) => Show (a, b, c, d, e, f)

Since: base-2.1

Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> (a, b, c, d, e, f) -> ShowS #

show :: (a, b, c, d, e, f) -> String #

showList :: [(a, b, c, d, e, f)] -> ShowS #

(Show (p a b), Show (q a b)) => Show (Sum p q a b) 
Instance details

Defined in Data.Bifunctor.Sum

Methods

showsPrec :: Int -> Sum p q a b -> ShowS #

show :: Sum p q a b -> String #

showList :: [Sum p q a b] -> ShowS #

(Show (f a b), Show (g a b)) => Show (Product f g a b) 
Instance details

Defined in Data.Bifunctor.Product

Methods

showsPrec :: Int -> Product f g a b -> ShowS #

show :: Product f g a b -> String #

showList :: [Product f g a b] -> ShowS #

(Show a, Show b, Show c, Show d, Show e, Show f, Show g) => Show (a, b, c, d, e, f, g)

Since: base-2.1

Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> (a, b, c, d, e, f, g) -> ShowS #

show :: (a, b, c, d, e, f, g) -> String #

showList :: [(a, b, c, d, e, f, g)] -> ShowS #

Show (f (p a b)) => Show (Tannen f p a b) 
Instance details

Defined in Data.Bifunctor.Tannen

Methods

showsPrec :: Int -> Tannen f p a b -> ShowS #

show :: Tannen f p a b -> String #

showList :: [Tannen f p a b] -> ShowS #

(Show a, Show b, Show c, Show d, Show e, Show f, Show g, Show h) => Show (a, b, c, d, e, f, g, h)

Since: base-2.1

Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> (a, b, c, d, e, f, g, h) -> ShowS #

show :: (a, b, c, d, e, f, g, h) -> String #

showList :: [(a, b, c, d, e, f, g, h)] -> ShowS #

(Show a, Show b, Show c, Show d, Show e, Show f, Show g, Show h, Show i) => Show (a, b, c, d, e, f, g, h, i)

Since: base-2.1

Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> (a, b, c, d, e, f, g, h, i) -> ShowS #

show :: (a, b, c, d, e, f, g, h, i) -> String #

showList :: [(a, b, c, d, e, f, g, h, i)] -> ShowS #

Show (p (f a) (g b)) => Show (Biff p f g a b) 
Instance details

Defined in Data.Bifunctor.Biff

Methods

showsPrec :: Int -> Biff p f g a b -> ShowS #

show :: Biff p f g a b -> String #

showList :: [Biff p f g a b] -> ShowS #

(Show a, Show b, Show c, Show d, Show e, Show f, Show g, Show h, Show i, Show j) => Show (a, b, c, d, e, f, g, h, i, j)

Since: base-2.1

Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> (a, b, c, d, e, f, g, h, i, j) -> ShowS #

show :: (a, b, c, d, e, f, g, h, i, j) -> String #

showList :: [(a, b, c, d, e, f, g, h, i, j)] -> ShowS #

(Show a, Show b, Show c, Show d, Show e, Show f, Show g, Show h, Show i, Show j, Show k) => Show (a, b, c, d, e, f, g, h, i, j, k)

Since: base-2.1

Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> (a, b, c, d, e, f, g, h, i, j, k) -> ShowS #

show :: (a, b, c, d, e, f, g, h, i, j, k) -> String #

showList :: [(a, b, c, d, e, f, g, h, i, j, k)] -> ShowS #

(Show a, Show b, Show c, Show d, Show e, Show f, Show g, Show h, Show i, Show j, Show k, Show l) => Show (a, b, c, d, e, f, g, h, i, j, k, l)

Since: base-2.1

Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> (a, b, c, d, e, f, g, h, i, j, k, l) -> ShowS #

show :: (a, b, c, d, e, f, g, h, i, j, k, l) -> String #

showList :: [(a, b, c, d, e, f, g, h, i, j, k, l)] -> ShowS #

(Show a, Show b, Show c, Show d, Show e, Show f, Show g, Show h, Show i, Show j, Show k, Show l, Show m) => Show (a, b, c, d, e, f, g, h, i, j, k, l, m)

Since: base-2.1

Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> (a, b, c, d, e, f, g, h, i, j, k, l, m) -> ShowS #

show :: (a, b, c, d, e, f, g, h, i, j, k, l, m) -> String #

showList :: [(a, b, c, d, e, f, g, h, i, j, k, l, m)] -> ShowS #

(Show a, Show b, Show c, Show d, Show e, Show f, Show g, Show h, Show i, Show j, Show k, Show l, Show m, Show n) => Show (a, b, c, d, e, f, g, h, i, j, k, l, m, n)

Since: base-2.1

Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n) -> ShowS #

show :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n) -> String #

showList :: [(a, b, c, d, e, f, g, h, i, j, k, l, m, n)] -> ShowS #

(Show a, Show b, Show c, Show d, Show e, Show f, Show g, Show h, Show i, Show j, Show k, Show l, Show m, Show n, Show o) => Show (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o)

Since: base-2.1

Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) -> ShowS #

show :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) -> String #

showList :: [(a, b, c, d, e, f, g, h, i, j, k, l, m, n, o)] -> ShowS #

class Typeable (a :: k) #

The class Typeable allows a concrete representation of a type to be calculated.

Minimal complete definition

typeRep#

Instances

Instances details
HasDict (Typeable k, Typeable a) (TypeRep a) 
Instance details

Defined in Data.Constraint

Methods

evidence :: TypeRep a -> Dict (Typeable k, Typeable a) #

class Monad m => MonadFail (m :: Type -> Type) where #

When a value is bound in do-notation, the pattern on the left hand side of <- might not match. In this case, this class provides a function to recover.

A Monad without a MonadFail instance may only be used in conjunction with pattern that always match, such as newtypes, tuples, data types with only a single data constructor, and irrefutable patterns (~pat).

Instances of MonadFail should satisfy the following law: fail s should be a left zero for >>=,

fail s >>= f  =  fail s

If your Monad is also MonadPlus, a popular definition is

fail _ = mzero

Since: base-4.9.0.0

Methods

fail :: String -> m a #

Instances

Instances details
MonadFail []

Since: base-4.9.0.0

Instance details

Defined in Control.Monad.Fail

Methods

fail :: String -> [a] #

MonadFail Maybe

Since: base-4.9.0.0

Instance details

Defined in Control.Monad.Fail

Methods

fail :: String -> Maybe a #

MonadFail IO

Since: base-4.9.0.0

Instance details

Defined in Control.Monad.Fail

Methods

fail :: String -> IO a #

MonadFail Q 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

fail :: String -> Q a #

MonadFail IResult 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

fail :: String -> IResult a #

MonadFail Result 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

fail :: String -> Result a #

MonadFail Parser 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

fail :: String -> Parser a #

MonadFail ReadP

Since: base-4.9.0.0

Instance details

Defined in Text.ParserCombinators.ReadP

Methods

fail :: String -> ReadP a #

MonadFail DList 
Instance details

Defined in Data.DList

Methods

fail :: String -> DList a #

MonadFail Vector

Since: vector-0.12.1.0

Instance details

Defined in Data.Vector

Methods

fail :: String -> Vector a #

MonadFail SmallArray 
Instance details

Defined in Data.Primitive.SmallArray

Methods

fail :: String -> SmallArray a #

MonadFail Array 
Instance details

Defined in Data.Primitive.Array

Methods

fail :: String -> Array a #

MonadFail P

Since: base-4.9.0.0

Instance details

Defined in Text.ParserCombinators.ReadP

Methods

fail :: String -> P a #

MonadFail (Parser i) 
Instance details

Defined in Data.Attoparsec.Internal.Types

Methods

fail :: String -> Parser i a #

Monad m => MonadFail (MaybeT m) 
Instance details

Defined in Control.Monad.Trans.Maybe

Methods

fail :: String -> MaybeT m a #

MonadFail f => MonadFail (Ap f)

Since: base-4.12.0.0

Instance details

Defined in Data.Monoid

Methods

fail :: String -> Ap f a #

MonadFail m => MonadFail (IdentityT m) 
Instance details

Defined in Control.Monad.Trans.Identity

Methods

fail :: String -> IdentityT m a #

MonadFail m => MonadFail (ExceptT e m) 
Instance details

Defined in Control.Monad.Trans.Except

Methods

fail :: String -> ExceptT e m a #

(Functor f, MonadFail m) => MonadFail (FreeT f m) 
Instance details

Defined in Control.Monad.Trans.Free

Methods

fail :: String -> FreeT f m a #

(Monad m, Error e) => MonadFail (ErrorT e m) 
Instance details

Defined in Control.Monad.Trans.Error

Methods

fail :: String -> ErrorT e m a #

MonadFail m => MonadFail (StateT s m) 
Instance details

Defined in Control.Monad.Trans.State.Strict

Methods

fail :: String -> StateT s m a #

MonadFail m => MonadFail (ReaderT r m) 
Instance details

Defined in Control.Monad.Trans.Reader

Methods

fail :: String -> ReaderT r m a #

MonadFail m => MonadFail (StateT s m) 
Instance details

Defined in Lens.Micro

Methods

fail :: String -> StateT s m a #

class IsString a where #

Class for string-like datastructures; used by the overloaded string extension (-XOverloadedStrings in GHC).

Methods

fromString :: String -> a #

Instances

Instances details
IsString ByteString 
Instance details

Defined in Data.ByteString.Internal

IsString ByteString 
Instance details

Defined in Data.ByteString.Lazy.Internal

IsString Value 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

fromString :: String -> Value #

IsString Alphabet 
Instance details

Defined in Data.ByteString.Base58.Internal

IsString String 
Instance details

Defined in Basement.UTF8.Base

Methods

fromString :: String0 -> String #

(TypeError ('Text "There is no instance defined for (IsString MText)" :$$: 'Text "Consider using QuasiQuotes: `[mt|some text...|]`") :: Constraint) => IsString MText 
Instance details

Defined in Michelson.Text

Methods

fromString :: String -> MText #

IsString DocTypeRepLHS 
Instance details

Defined in Michelson.Typed.Haskell.Doc

Methods

fromString :: String -> DocTypeRepLHS #

IsString Anchor 
Instance details

Defined in Util.Markdown

Methods

fromString :: String -> Anchor #

IsString Doc 
Instance details

Defined in Text.PrettyPrint.HughesPJ

Methods

fromString :: String -> Doc #

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 a, Hashable a) => IsString (Hashed a) 
Instance details

Defined in Data.Hashable.Class

Methods

fromString :: String -> Hashed a #

IsString (PrintComment st) 
Instance details

Defined in Michelson.Typed.Instr

IsString (Doc a) 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Methods

fromString :: String -> Doc a #

IsString (Annotation tag) 
Instance details

Defined in Michelson.Untyped.Annotation

Methods

fromString :: String -> Annotation tag #

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 #

class Functor f => Applicative (f :: Type -> Type) where #

A functor with application, providing operations to

  • embed pure expressions (pure), and
  • sequence computations and combine their results (<*> and liftA2).

A minimal complete definition must include implementations of pure and of either <*> or liftA2. If it defines both, then they must behave the same as their default definitions:

(<*>) = liftA2 id
liftA2 f x y = f <$> x <*> y

Further, any definition must satisfy the following:

Identity
pure id <*> v = v
Composition
pure (.) <*> u <*> v <*> w = u <*> (v <*> w)
Homomorphism
pure f <*> pure x = pure (f x)
Interchange
u <*> pure y = pure ($ y) <*> u

The other methods have the following default definitions, which may be overridden with equivalent specialized implementations:

As a consequence of these laws, the Functor instance for f will satisfy

It may be useful to note that supposing

forall x y. p (q x y) = f x . g y

it follows from the above that

liftA2 p (liftA2 q u v) = liftA2 f u . liftA2 g v

If f is also a Monad, it should satisfy

(which implies that pure and <*> satisfy the applicative functor laws).

Minimal complete definition

pure, ((<*>) | liftA2)

Methods

pure :: a -> f a #

Lift a value.

(<*>) :: f (a -> b) -> f a -> f b infixl 4 #

Sequential application.

A few functors support an implementation of <*> that is more efficient than the default one.

liftA2 :: (a -> b -> c) -> f a -> f b -> f c #

Lift a binary function to actions.

Some functors support an implementation of liftA2 that is more efficient than the default one. In particular, if fmap is an expensive operation, it is likely better to use liftA2 than to fmap over the structure and then use <*>.

(*>) :: f a -> f b -> f b infixl 4 #

Sequence actions, discarding the value of the first argument.

(<*) :: f a -> f b -> f a infixl 4 #

Sequence actions, discarding the value of the second argument.

Instances

Instances details
Applicative []

Since: base-2.1

Instance details

Defined in GHC.Base

Methods

pure :: a -> [a] #

(<*>) :: [a -> b] -> [a] -> [b] #

liftA2 :: (a -> b -> c) -> [a] -> [b] -> [c] #

(*>) :: [a] -> [b] -> [b] #

(<*) :: [a] -> [b] -> [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 #

Applicative IO

Since: base-2.1

Instance details

Defined in GHC.Base

Methods

pure :: a -> IO a #

(<*>) :: IO (a -> b) -> IO a -> IO b #

liftA2 :: (a -> b -> c) -> IO a -> IO b -> IO c #

(*>) :: IO a -> IO b -> IO b #

(<*) :: IO a -> IO b -> IO a #

Applicative Par1

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

pure :: a -> Par1 a #

(<*>) :: Par1 (a -> b) -> Par1 a -> Par1 b #

liftA2 :: (a -> b -> c) -> Par1 a -> Par1 b -> Par1 c #

(*>) :: Par1 a -> Par1 b -> Par1 b #

(<*) :: Par1 a -> Par1 b -> Par1 a #

Applicative Q 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

pure :: a -> Q a #

(<*>) :: Q (a -> b) -> Q a -> Q b #

liftA2 :: (a -> b -> c) -> Q a -> Q b -> Q c #

(*>) :: Q a -> Q b -> Q b #

(<*) :: Q a -> Q b -> Q a #

Applicative IResult 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

pure :: a -> IResult a #

(<*>) :: IResult (a -> b) -> IResult a -> IResult b #

liftA2 :: (a -> b -> c) -> IResult a -> IResult b -> IResult c #

(*>) :: IResult a -> IResult b -> IResult b #

(<*) :: IResult a -> IResult b -> IResult a #

Applicative Result 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

pure :: a -> Result a #

(<*>) :: Result (a -> b) -> Result a -> Result b #

liftA2 :: (a -> b -> c) -> Result a -> Result b -> Result c #

(*>) :: Result a -> Result b -> Result b #

(<*) :: Result a -> Result b -> Result a #

Applicative Parser 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

pure :: a -> Parser a #

(<*>) :: Parser (a -> b) -> Parser a -> Parser b #

liftA2 :: (a -> b -> c) -> Parser a -> Parser b -> Parser c #

(*>) :: Parser a -> Parser b -> Parser b #

(<*) :: Parser a -> Parser b -> Parser a #

Applicative Complex

Since: base-4.9.0.0

Instance details

Defined in Data.Complex

Methods

pure :: a -> Complex a #

(<*>) :: Complex (a -> b) -> Complex a -> Complex b #

liftA2 :: (a -> b -> c) -> Complex a -> Complex b -> Complex c #

(*>) :: Complex a -> Complex b -> Complex b #

(<*) :: Complex a -> Complex b -> Complex a #

Applicative Min

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

pure :: a -> Min a #

(<*>) :: Min (a -> b) -> Min a -> Min b #

liftA2 :: (a -> b -> c) -> Min a -> Min b -> Min c #

(*>) :: Min a -> Min b -> Min b #

(<*) :: Min a -> Min b -> Min a #

Applicative Max

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

pure :: a -> Max a #

(<*>) :: Max (a -> b) -> Max a -> Max b #

liftA2 :: (a -> b -> c) -> Max a -> Max b -> Max c #

(*>) :: Max a -> Max b -> Max b #

(<*) :: Max a -> Max b -> Max a #

Applicative First

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

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 #

Applicative Last

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

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 #

Applicative Option

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

pure :: a -> Option a #

(<*>) :: Option (a -> b) -> Option a -> Option b #

liftA2 :: (a -> b -> c) -> Option a -> Option b -> Option c #

(*>) :: Option a -> Option b -> Option b #

(<*) :: Option a -> Option b -> Option a #

Applicative ZipList
f <$> ZipList xs1 <*> ... <*> ZipList xsN
    = ZipList (zipWithN f xs1 ... xsN)

where zipWithN refers to the zipWith function of the appropriate arity (zipWith, zipWith3, zipWith4, ...). For example:

(\a b c -> stimes c [a, b]) <$> ZipList "abcd" <*> ZipList "567" <*> ZipList [1..]
    = ZipList (zipWith3 (\a b c -> stimes c [a, b]) "abcd" "567" [1..])
    = ZipList {getZipList = ["a5","b6b6","c7c7c7"]}

Since: base-2.1

Instance details

Defined in Control.Applicative

Methods

pure :: a -> ZipList a #

(<*>) :: ZipList (a -> b) -> ZipList a -> ZipList b #

liftA2 :: (a -> b -> c) -> ZipList a -> ZipList b -> ZipList c #

(*>) :: ZipList a -> ZipList b -> ZipList b #

(<*) :: ZipList a -> ZipList b -> ZipList a #

Applicative Identity

Since: base-4.8.0.0

Instance details

Defined in Data.Functor.Identity

Methods

pure :: a -> Identity a #

(<*>) :: Identity (a -> b) -> Identity a -> Identity b #

liftA2 :: (a -> b -> c) -> Identity a -> Identity b -> Identity c #

(*>) :: Identity a -> Identity b -> Identity b #

(<*) :: Identity a -> Identity b -> Identity a #

Applicative STM

Since: base-4.8.0.0

Instance details

Defined in GHC.Conc.Sync

Methods

pure :: a -> STM a #

(<*>) :: STM (a -> b) -> STM a -> STM b #

liftA2 :: (a -> b -> c) -> STM a -> STM b -> STM c #

(*>) :: STM a -> STM b -> STM b #

(<*) :: STM a -> STM b -> STM 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 #

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 #

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 #

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 #

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 #

Applicative Down

Since: base-4.11.0.0

Instance details

Defined in Data.Ord

Methods

pure :: a -> Down a #

(<*>) :: Down (a -> b) -> Down a -> Down b #

liftA2 :: (a -> b -> c) -> Down a -> Down b -> Down c #

(*>) :: Down a -> Down b -> Down b #

(<*) :: Down a -> Down b -> Down a #

Applicative ReadP

Since: base-4.6.0.0

Instance details

Defined in Text.ParserCombinators.ReadP

Methods

pure :: a -> ReadP a #

(<*>) :: ReadP (a -> b) -> ReadP a -> ReadP b #

liftA2 :: (a -> b -> c) -> ReadP a -> ReadP b -> ReadP c #

(*>) :: ReadP a -> ReadP b -> ReadP b #

(<*) :: ReadP a -> ReadP b -> ReadP a #

Applicative NonEmpty

Since: base-4.9.0.0

Instance details

Defined in GHC.Base

Methods

pure :: a -> NonEmpty a #

(<*>) :: NonEmpty (a -> b) -> NonEmpty a -> NonEmpty b #

liftA2 :: (a -> b -> c) -> NonEmpty a -> NonEmpty b -> NonEmpty c #

(*>) :: NonEmpty a -> NonEmpty b -> NonEmpty b #

(<*) :: NonEmpty a -> NonEmpty b -> NonEmpty a #

Applicative Put 
Instance details

Defined in Data.ByteString.Builder.Internal

Methods

pure :: a -> Put a #

(<*>) :: Put (a -> b) -> Put a -> Put b #

liftA2 :: (a -> b -> c) -> Put a -> Put b -> Put c #

(*>) :: Put a -> Put b -> Put b #

(<*) :: Put a -> Put b -> Put a #

Applicative Tree 
Instance details

Defined in Data.Tree

Methods

pure :: a -> Tree a #

(<*>) :: Tree (a -> b) -> Tree a -> Tree b #

liftA2 :: (a -> b -> c) -> Tree a -> Tree b -> Tree c #

(*>) :: Tree a -> Tree b -> Tree b #

(<*) :: Tree a -> Tree b -> Tree a #

Applicative Seq

Since: containers-0.5.4

Instance details

Defined in Data.Sequence.Internal

Methods

pure :: a -> Seq a #

(<*>) :: Seq (a -> b) -> Seq a -> Seq b #

liftA2 :: (a -> b -> c) -> Seq a -> Seq b -> Seq c #

(*>) :: Seq a -> Seq b -> Seq b #

(<*) :: Seq a -> Seq b -> Seq a #

Applicative CryptoFailable 
Instance details

Defined in Crypto.Error.Types

Applicative DList 
Instance details

Defined in Data.DList

Methods

pure :: a -> DList a #

(<*>) :: DList (a -> b) -> DList a -> DList b #

liftA2 :: (a -> b -> c) -> DList a -> DList b -> DList c #

(*>) :: DList a -> DList b -> DList b #

(<*) :: DList a -> DList b -> DList a #

Applicative Vector 
Instance details

Defined in Data.Vector

Methods

pure :: a -> Vector a #

(<*>) :: Vector (a -> b) -> Vector a -> Vector b #

liftA2 :: (a -> b -> c) -> Vector a -> Vector b -> Vector c #

(*>) :: Vector a -> Vector b -> Vector b #

(<*) :: Vector a -> Vector b -> Vector a #

Applicative SmallArray 
Instance details

Defined in Data.Primitive.SmallArray

Methods

pure :: a -> SmallArray a #

(<*>) :: SmallArray (a -> b) -> SmallArray a -> SmallArray b #

liftA2 :: (a -> b -> c) -> SmallArray a -> SmallArray b -> SmallArray c #

(*>) :: SmallArray a -> SmallArray b -> SmallArray b #

(<*) :: SmallArray a -> SmallArray b -> SmallArray a #

Applicative Array 
Instance details

Defined in Data.Primitive.Array

Methods

pure :: a -> Array a #

(<*>) :: Array (a -> b) -> Array a -> Array b #

liftA2 :: (a -> b -> c) -> Array a -> Array b -> Array c #

(*>) :: Array a -> Array b -> Array b #

(<*) :: Array a -> Array b -> Array a #

Applicative Identity 
Instance details

Defined in Data.Vinyl.Functor

Methods

pure :: a -> Identity a #

(<*>) :: Identity (a -> b) -> Identity a -> Identity b #

liftA2 :: (a -> b -> c) -> Identity a -> Identity b -> Identity c #

(*>) :: Identity a -> Identity b -> Identity b #

(<*) :: Identity a -> Identity b -> Identity a #

Applicative Thunk 
Instance details

Defined in Data.Vinyl.Functor

Methods

pure :: a -> Thunk a #

(<*>) :: Thunk (a -> b) -> Thunk a -> Thunk b #

liftA2 :: (a -> b -> c) -> Thunk a -> Thunk b -> Thunk c #

(*>) :: Thunk a -> Thunk b -> Thunk b #

(<*) :: Thunk a -> Thunk b -> Thunk a #

Applicative P

Since: base-4.5.0.0

Instance details

Defined in Text.ParserCombinators.ReadP

Methods

pure :: a -> P a #

(<*>) :: P (a -> b) -> P a -> P b #

liftA2 :: (a -> b -> c) -> P a -> P b -> P c #

(*>) :: P a -> P b -> P b #

(<*) :: P a -> P b -> P a #

Applicative IndigoM Source # 
Instance details

Defined in Indigo.Frontend.Program

Methods

pure :: a -> IndigoM a #

(<*>) :: IndigoM (a -> b) -> IndigoM a -> IndigoM b #

liftA2 :: (a -> b -> c) -> IndigoM a -> IndigoM b -> IndigoM c #

(*>) :: IndigoM a -> IndigoM b -> IndigoM b #

(<*) :: IndigoM a -> IndigoM b -> IndigoM a #

() :=> (Applicative ((->) a :: Type -> Type)) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Applicative ((->) a) #

() :=> (Applicative []) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Applicative [] #

() :=> (Applicative Maybe) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Applicative Maybe #

() :=> (Applicative IO) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Applicative IO #

() :=> (Applicative (Either a)) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Applicative (Either a) #

Applicative (Either e)

Since: base-3.0

Instance details

Defined in Data.Either

Methods

pure :: a -> Either e a #

(<*>) :: Either e (a -> b) -> Either e a -> Either e b #

liftA2 :: (a -> b -> c) -> Either e a -> Either e b -> Either e c #

(*>) :: Either e a -> Either e b -> Either e b #

(<*) :: Either e a -> Either e b -> Either e a #

Applicative (U1 :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

pure :: a -> U1 a #

(<*>) :: U1 (a -> b) -> U1 a -> U1 b #

liftA2 :: (a -> b -> c) -> U1 a -> U1 b -> U1 c #

(*>) :: U1 a -> U1 b -> U1 b #

(<*) :: U1 a -> U1 b -> U1 a #

Monoid a => Applicative ((,) a)

For tuples, the Monoid constraint on a determines how the first values merge. For example, Strings concatenate:

("hello ", (+15)) <*> ("world!", 2002)
("hello world!",2017)

Since: base-2.1

Instance details

Defined in GHC.Base

Methods

pure :: a0 -> (a, a0) #

(<*>) :: (a, a0 -> b) -> (a, a0) -> (a, b) #

liftA2 :: (a0 -> b -> c) -> (a, a0) -> (a, b) -> (a, c) #

(*>) :: (a, a0) -> (a, b) -> (a, b) #

(<*) :: (a, a0) -> (a, b) -> (a, a0) #

Representable f => Applicative (Co f) 
Instance details

Defined in Data.Functor.Rep

Methods

pure :: a -> Co f a #

(<*>) :: Co f (a -> b) -> Co f a -> Co f b #

liftA2 :: (a -> b -> c) -> Co f a -> Co f b -> Co f c #

(*>) :: Co f a -> Co f b -> Co f b #

(<*) :: Co f a -> Co f b -> Co f a #

Applicative (Parser i) 
Instance details

Defined in Data.Attoparsec.Internal.Types

Methods

pure :: a -> Parser i a #

(<*>) :: Parser i (a -> b) -> Parser i a -> Parser i b #

liftA2 :: (a -> b -> c) -> Parser i a -> Parser i b -> Parser i c #

(*>) :: Parser i a -> Parser i b -> Parser i b #

(<*) :: Parser i a -> Parser i b -> Parser i a #

Monad m => Applicative (WrappedMonad m)

Since: base-2.1

Instance details

Defined in Control.Applicative

Methods

pure :: a -> WrappedMonad m a #

(<*>) :: WrappedMonad m (a -> b) -> WrappedMonad m a -> WrappedMonad m b #

liftA2 :: (a -> b -> c) -> WrappedMonad m a -> WrappedMonad m b -> WrappedMonad m c #

(*>) :: WrappedMonad m a -> WrappedMonad m b -> WrappedMonad m b #

(<*) :: WrappedMonad m a -> WrappedMonad m b -> WrappedMonad m a #

Arrow a => Applicative (ArrowMonad a)

Since: base-4.6.0.0

Instance details

Defined in Control.Arrow

Methods

pure :: a0 -> ArrowMonad a a0 #

(<*>) :: ArrowMonad a (a0 -> b) -> ArrowMonad a a0 -> ArrowMonad a b #

liftA2 :: (a0 -> b -> c) -> ArrowMonad a a0 -> ArrowMonad a b -> ArrowMonad a c #

(*>) :: ArrowMonad a a0 -> ArrowMonad a b -> ArrowMonad a b #

(<*) :: ArrowMonad a a0 -> ArrowMonad a b -> ArrowMonad a a0 #

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 #

(Functor m, Monad m) => Applicative (MaybeT m) 
Instance details

Defined in Control.Monad.Trans.Maybe

Methods

pure :: a -> MaybeT m a #

(<*>) :: MaybeT m (a -> b) -> MaybeT m a -> MaybeT m b #

liftA2 :: (a -> b -> c) -> MaybeT m a -> MaybeT m b -> MaybeT m c #

(*>) :: MaybeT m a -> MaybeT m b -> MaybeT m b #

(<*) :: MaybeT m a -> MaybeT m b -> MaybeT m a #

Alternative f => Applicative (Cofree f) 
Instance details

Defined in Control.Comonad.Cofree

Methods

pure :: a -> Cofree f a #

(<*>) :: Cofree f (a -> b) -> Cofree f a -> Cofree f b #

liftA2 :: (a -> b -> c) -> Cofree f a -> Cofree f b -> Cofree f c #

(*>) :: Cofree f a -> Cofree f b -> Cofree f b #

(<*) :: Cofree f a -> Cofree f b -> Cofree f a #

Functor f => Applicative (Free f) 
Instance details

Defined in Control.Monad.Free

Methods

pure :: a -> Free f a #

(<*>) :: Free f (a -> b) -> Free f a -> Free f b #

liftA2 :: (a -> b -> c) -> Free f a -> Free f b -> Free f c #

(*>) :: Free f a -> Free f b -> Free f b #

(<*) :: Free f a -> Free f b -> Free f a #

Applicative f => Applicative (Yoneda f) 
Instance details

Defined in Data.Functor.Yoneda

Methods

pure :: a -> Yoneda f a #

(<*>) :: Yoneda f (a -> b) -> Yoneda f a -> Yoneda f b #

liftA2 :: (a -> b -> c) -> Yoneda f a -> Yoneda f b -> Yoneda f c #

(*>) :: Yoneda f a -> Yoneda f b -> Yoneda f b #

(<*) :: Yoneda f a -> Yoneda f b -> Yoneda f a #

Applicative (ReifiedGetter s) 
Instance details

Defined in Control.Lens.Reified

Methods

pure :: a -> ReifiedGetter s a #

(<*>) :: ReifiedGetter s (a -> b) -> ReifiedGetter s a -> ReifiedGetter s b #

liftA2 :: (a -> b -> c) -> ReifiedGetter s a -> ReifiedGetter s b -> ReifiedGetter s c #

(*>) :: ReifiedGetter s a -> ReifiedGetter s b -> ReifiedGetter s b #

(<*) :: ReifiedGetter s a -> ReifiedGetter s b -> ReifiedGetter s a #

Applicative (ReifiedFold s) 
Instance details

Defined in Control.Lens.Reified

Methods

pure :: a -> ReifiedFold s a #

(<*>) :: ReifiedFold s (a -> b) -> ReifiedFold s a -> ReifiedFold s b #

liftA2 :: (a -> b -> c) -> ReifiedFold s a -> ReifiedFold s b -> ReifiedFold s c #

(*>) :: ReifiedFold s a -> ReifiedFold s b -> ReifiedFold s b #

(<*) :: ReifiedFold s a -> ReifiedFold s b -> ReifiedFold s a #

Applicative f => Applicative (Indexing f) 
Instance details

Defined in Control.Lens.Internal.Indexed

Methods

pure :: a -> Indexing f a #

(<*>) :: Indexing f (a -> b) -> Indexing f a -> Indexing f b #

liftA2 :: (a -> b -> c) -> Indexing f a -> Indexing f b -> Indexing f c #

(*>) :: Indexing f a -> Indexing f b -> Indexing f b #

(<*) :: Indexing f a -> Indexing f b -> Indexing f a #

Applicative f => Applicative (Indexing64 f) 
Instance details

Defined in Control.Lens.Internal.Indexed

Methods

pure :: a -> Indexing64 f a #

(<*>) :: Indexing64 f (a -> b) -> Indexing64 f a -> Indexing64 f b #

liftA2 :: (a -> b -> c) -> Indexing64 f a -> Indexing64 f b -> Indexing64 f c #

(*>) :: Indexing64 f a -> Indexing64 f b -> Indexing64 f b #

(<*) :: Indexing64 f a -> Indexing64 f b -> Indexing64 f a #

(Applicative (Rep p), Representable p) => Applicative (Prep p) 
Instance details

Defined in Data.Profunctor.Rep

Methods

pure :: a -> Prep p a #

(<*>) :: Prep p (a -> b) -> Prep p a -> Prep p b #

liftA2 :: (a -> b -> c) -> Prep p a -> Prep p b -> Prep p c #

(*>) :: Prep p a -> Prep p b -> Prep p b #

(<*) :: Prep p a -> Prep p b -> Prep p a #

Applicative (Program instr) Source # 
Instance details

Defined in Indigo.Frontend.Program

Methods

pure :: a -> Program instr a #

(<*>) :: Program instr (a -> b) -> Program instr a -> Program instr b #

liftA2 :: (a -> b -> c) -> Program instr a -> Program instr b -> Program instr c #

(*>) :: Program instr a -> Program instr b -> Program instr b #

(<*) :: Program instr a -> Program instr b -> Program instr a #

Class (Functor f) (Applicative f) 
Instance details

Defined in Data.Constraint

Methods

cls :: Applicative f :- Functor f #

Class (Applicative f) (Monad f) 
Instance details

Defined in Data.Constraint

Methods

cls :: Monad f :- Applicative f #

Class (Applicative f) (Alternative f) 
Instance details

Defined in Data.Constraint

(Monad m) :=> (Applicative (WrappedMonad m)) 
Instance details

Defined in Data.Constraint

(Monoid a) :=> (Applicative ((,) a)) 
Instance details

Defined in Data.Constraint

Methods

ins :: Monoid a :- Applicative ((,) a) #

(Monoid a) :=> (Applicative (Const a :: Type -> Type)) 
Instance details

Defined in Data.Constraint

Methods

ins :: Monoid a :- Applicative (Const a) #

Applicative f => Applicative (Rec1 f)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

pure :: a -> Rec1 f a #

(<*>) :: Rec1 f (a -> b) -> Rec1 f a -> Rec1 f b #

liftA2 :: (a -> b -> c) -> Rec1 f a -> Rec1 f b -> Rec1 f c #

(*>) :: Rec1 f a -> Rec1 f b -> Rec1 f b #

(<*) :: Rec1 f a -> Rec1 f b -> Rec1 f a #

Arrow a => Applicative (WrappedArrow a b)

Since: base-2.1

Instance details

Defined in Control.Applicative

Methods

pure :: a0 -> WrappedArrow a b a0 #

(<*>) :: WrappedArrow a b (a0 -> b0) -> WrappedArrow a b a0 -> WrappedArrow a b b0 #

liftA2 :: (a0 -> b0 -> c) -> WrappedArrow a b a0 -> WrappedArrow a b b0 -> WrappedArrow a b c #

(*>) :: WrappedArrow a b a0 -> WrappedArrow a b b0 -> WrappedArrow a b b0 #

(<*) :: WrappedArrow a b a0 -> WrappedArrow a b b0 -> WrappedArrow a b a0 #

Monoid m => Applicative (Const m :: Type -> Type)

Since: base-2.0.1

Instance details

Defined in Data.Functor.Const

Methods

pure :: a -> Const m a #

(<*>) :: Const m (a -> b) -> Const m a -> Const m b #

liftA2 :: (a -> b -> c) -> Const m a -> Const m b -> Const m c #

(*>) :: Const m a -> Const m b -> Const m b #

(<*) :: Const m a -> Const m b -> Const m 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 #

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 #

Biapplicative p => Applicative (Join p) 
Instance details

Defined in Data.Bifunctor.Join

Methods

pure :: a -> Join p a #

(<*>) :: Join p (a -> b) -> Join p a -> Join p b #

liftA2 :: (a -> b -> c) -> Join p a -> Join p b -> Join p c #

(*>) :: Join p a -> Join p b -> Join p b #

(<*) :: Join p a -> Join p b -> Join p a #

Biapplicative p => Applicative (Fix p) 
Instance details

Defined in Data.Bifunctor.Fix

Methods

pure :: a -> Fix p a #

(<*>) :: Fix p (a -> b) -> Fix p a -> Fix p b #

liftA2 :: (a -> b -> c) -> Fix p a -> Fix p b -> Fix p c #

(*>) :: Fix p a -> Fix p b -> Fix p b #

(<*) :: Fix p a -> Fix p b -> Fix p a #

Applicative m => Applicative (IdentityT m) 
Instance details

Defined in Control.Monad.Trans.Identity

Methods

pure :: a -> IdentityT m a #

(<*>) :: IdentityT m (a -> b) -> IdentityT m a -> IdentityT m b #

liftA2 :: (a -> b -> c) -> IdentityT m a -> IdentityT m b -> IdentityT m c #

(*>) :: IdentityT m a -> IdentityT m b -> IdentityT m b #

(<*) :: IdentityT m a -> IdentityT m b -> IdentityT m a #

(Applicative f, Monad f) => Applicative (WhenMissing f x)

Equivalent to ReaderT k (ReaderT x (MaybeT f)).

Since: containers-0.5.9

Instance details

Defined in Data.IntMap.Internal

Methods

pure :: a -> WhenMissing f x a #

(<*>) :: WhenMissing f x (a -> b) -> WhenMissing f x a -> WhenMissing f x b #

liftA2 :: (a -> b -> c) -> WhenMissing f x a -> WhenMissing f x b -> WhenMissing f x c #

(*>) :: WhenMissing f x a -> WhenMissing f x b -> WhenMissing f x b #

(<*) :: WhenMissing f x a -> WhenMissing f x b -> WhenMissing f x a #

(Functor m, Monad m) => Applicative (ExceptT e m) 
Instance details

Defined in Control.Monad.Trans.Except

Methods

pure :: a -> ExceptT e m a #

(<*>) :: ExceptT e m (a -> b) -> ExceptT e m a -> ExceptT e m b #

liftA2 :: (a -> b -> c) -> ExceptT e m a -> ExceptT e m b -> ExceptT e m c #

(*>) :: ExceptT e m a -> ExceptT e m b -> ExceptT e m b #

(<*) :: ExceptT e m a -> ExceptT e m b -> ExceptT e m a #

(Functor f, Monad m) => Applicative (FreeT f m) 
Instance details

Defined in Control.Monad.Trans.Free

Methods

pure :: a -> FreeT f m a #

(<*>) :: FreeT f m (a -> b) -> FreeT f m a -> FreeT f m b #

liftA2 :: (a -> b -> c) -> FreeT f m a -> FreeT f m b -> FreeT f m c #

(*>) :: FreeT f m a -> FreeT f m b -> FreeT f m b #

(<*) :: FreeT f m a -> FreeT f m b -> FreeT f m a #

(Alternative f, Applicative w) => Applicative (CofreeT f w) 
Instance details

Defined in Control.Comonad.Trans.Cofree

Methods

pure :: a -> CofreeT f w a #

(<*>) :: CofreeT f w (a -> b) -> CofreeT f w a -> CofreeT f w b #

liftA2 :: (a -> b -> c) -> CofreeT f w a -> CofreeT f w b -> CofreeT f w c #

(*>) :: CofreeT f w a -> CofreeT f w b -> CofreeT f w b #

(<*) :: CofreeT f w a -> CofreeT f w b -> CofreeT f w a #

(Applicative f, Applicative g) => Applicative (Day f g) 
Instance details

Defined in Data.Functor.Day

Methods

pure :: a -> Day f g a #

(<*>) :: Day f g (a -> b) -> Day f g a -> Day f g b #

liftA2 :: (a -> b -> c) -> Day f g a -> Day f g b -> Day f g c #

(*>) :: Day f g a -> Day f g b -> Day f g b #

(<*) :: Day f g a -> Day f g b -> Day f g a #

(Functor m, Monad m) => Applicative (ErrorT e m) 
Instance details

Defined in Control.Monad.Trans.Error

Methods

pure :: a -> ErrorT e m a #

(<*>) :: ErrorT e m (a -> b) -> ErrorT e m a -> ErrorT e m b #

liftA2 :: (a -> b -> c) -> ErrorT e m a -> ErrorT e m b -> ErrorT e m c #

(*>) :: ErrorT e m a -> ErrorT e m b -> ErrorT e m b #

(<*) :: ErrorT e m a -> ErrorT e m b -> ErrorT e m a #

(Functor m, Monad m) => Applicative (StateT s m) 
Instance details

Defined in Control.Monad.Trans.State.Strict

Methods

pure :: a -> StateT s m a #

(<*>) :: StateT s m (a -> b) -> StateT s m a -> StateT s m b #

liftA2 :: (a -> b -> c) -> StateT s m a -> StateT s m b -> StateT s m c #

(*>) :: StateT s m a -> StateT s m b -> StateT s m b #

(<*) :: StateT s m a -> StateT s m b -> StateT s m a #

Applicative (Indexed i a) 
Instance details

Defined in Control.Lens.Internal.Indexed

Methods

pure :: a0 -> Indexed i a a0 #

(<*>) :: Indexed i a (a0 -> b) -> Indexed i a a0 -> Indexed i a b #

liftA2 :: (a0 -> b -> c) -> Indexed i a a0 -> Indexed i a b -> Indexed i a c #

(*>) :: Indexed i a a0 -> Indexed i a b -> Indexed i a b #

(<*) :: Indexed i a a0 -> Indexed i a b -> Indexed i a a0 #

Applicative m => Applicative (ReaderT r m) 
Instance details

Defined in Control.Monad.Trans.Reader

Methods

pure :: a -> ReaderT r m a #

(<*>) :: ReaderT r m (a -> b) -> ReaderT r m a -> ReaderT r m b #

liftA2 :: (a -> b -> c) -> ReaderT r m a -> ReaderT r m b -> ReaderT r m c #

(*>) :: ReaderT r m a -> ReaderT r m b -> ReaderT r m b #

(<*) :: ReaderT r m a -> ReaderT r m b -> ReaderT r m a #

(Monad m, Monoid s) => Applicative (Focusing m s) 
Instance details

Defined in Lens.Micro.Mtl.Internal

Methods

pure :: a -> Focusing m s a #

(<*>) :: Focusing m s (a -> b) -> Focusing m s a -> Focusing m s b #

liftA2 :: (a -> b -> c) -> Focusing m s a -> Focusing m s b -> Focusing m s c #

(*>) :: Focusing m s a -> Focusing m s b -> Focusing m s b #

(<*) :: Focusing m s a -> Focusing m s b -> Focusing m s a #

Applicative (k (May s)) => Applicative (FocusingMay k s) 
Instance details

Defined in Lens.Micro.Mtl.Internal

Methods

pure :: a -> FocusingMay k s a #

(<*>) :: FocusingMay k s (a -> b) -> FocusingMay k s a -> FocusingMay k s b #

liftA2 :: (a -> b -> c) -> FocusingMay k s a -> FocusingMay k s b -> FocusingMay k s c #

(*>) :: FocusingMay k s a -> FocusingMay k s b -> FocusingMay k s b #

(<*) :: FocusingMay k s a -> FocusingMay k s b -> FocusingMay k s a #

(Monad m, Monoid r) => Applicative (Effect m r) 
Instance details

Defined in Lens.Micro.Mtl.Internal

Methods

pure :: a -> Effect m r a #

(<*>) :: Effect m r (a -> b) -> Effect m r a -> Effect m r b #

liftA2 :: (a -> b -> c) -> Effect m r a -> Effect m r b -> Effect m r c #

(*>) :: Effect m r a -> Effect m r b -> Effect m r b #

(<*) :: Effect m r a -> Effect m r b -> Effect m r 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 #

Applicative (Bazaar a b) 
Instance details

Defined in Lens.Micro

Methods

pure :: a0 -> Bazaar a b a0 #

(<*>) :: Bazaar a b (a0 -> b0) -> Bazaar a b a0 -> Bazaar a b b0 #

liftA2 :: (a0 -> b0 -> c) -> Bazaar a b a0 -> Bazaar a b b0 -> Bazaar a b c #

(*>) :: Bazaar a b a0 -> Bazaar a b b0 -> Bazaar a b b0 #

(<*) :: Bazaar a b a0 -> Bazaar a b b0 -> Bazaar a b a0 #

(Functor m, Monad m) => Applicative (StateT s m) 
Instance details

Defined in Lens.Micro

Methods

pure :: a -> StateT s m a #

(<*>) :: StateT s m (a -> b) -> StateT s m a -> StateT s m b #

liftA2 :: (a -> b -> c) -> StateT s m a -> StateT s m b -> StateT s m c #

(*>) :: StateT s m a -> StateT s m b -> StateT s m b #

(<*) :: StateT s m a -> StateT s m b -> StateT s m a #

Applicative ((->) a :: Type -> Type)

Since: base-2.1

Instance details

Defined in GHC.Base

Methods

pure :: a0 -> a -> a0 #

(<*>) :: (a -> (a0 -> b)) -> (a -> a0) -> a -> b #

liftA2 :: (a0 -> b -> c) -> (a -> a0) -> (a -> b) -> a -> c #

(*>) :: (a -> a0) -> (a -> b) -> a -> b #

(<*) :: (a -> a0) -> (a -> b) -> a -> a0 #

Monoid c => Applicative (K1 i c :: Type -> Type)

Since: base-4.12.0.0

Instance details

Defined in GHC.Generics

Methods

pure :: a -> K1 i c a #

(<*>) :: K1 i c (a -> b) -> K1 i c a -> K1 i c b #

liftA2 :: (a -> b -> c0) -> K1 i c a -> K1 i c b -> K1 i c c0 #

(*>) :: K1 i c a -> K1 i c b -> K1 i c b #

(<*) :: K1 i c a -> K1 i c b -> K1 i c a #

(Applicative f, Applicative g) => Applicative (f :*: g)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

pure :: a -> (f :*: g) a #

(<*>) :: (f :*: g) (a -> b) -> (f :*: g) a -> (f :*: g) b #

liftA2 :: (a -> b -> c) -> (f :*: g) a -> (f :*: g) b -> (f :*: g) c #

(*>) :: (f :*: g) a -> (f :*: g) b -> (f :*: g) b #

(<*) :: (f :*: g) a -> (f :*: g) b -> (f :*: g) a #

(Applicative f, Applicative g) => Applicative (Product f g)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Product

Methods

pure :: a -> Product f g a #

(<*>) :: Product f g (a -> b) -> Product f g a -> Product f g b #

liftA2 :: (a -> b -> c) -> Product f g a -> Product f g b -> Product f g c #

(*>) :: Product f g a -> Product f g b -> Product f g b #

(<*) :: Product f g a -> Product f g b -> Product f g a #

(Monad f, Applicative f) => Applicative (WhenMatched f x y)

Equivalent to ReaderT Key (ReaderT x (ReaderT y (MaybeT f)))

Since: containers-0.5.9

Instance details

Defined in Data.IntMap.Internal

Methods

pure :: a -> WhenMatched f x y a #

(<*>) :: WhenMatched f x y (a -> b) -> WhenMatched f x y a -> WhenMatched f x y b #

liftA2 :: (a -> b -> c) -> WhenMatched f x y a -> WhenMatched f x y b -> WhenMatched f x y c #

(*>) :: WhenMatched f x y a -> WhenMatched f x y b -> WhenMatched f x y b #

(<*) :: WhenMatched f x y a -> WhenMatched f x y b -> WhenMatched f x y a #

(Applicative f, Monad f) => Applicative (WhenMissing f k x)

Equivalent to ReaderT k (ReaderT x (MaybeT f)) .

Since: containers-0.5.9

Instance details

Defined in Data.Map.Internal

Methods

pure :: a -> WhenMissing f k x a #

(<*>) :: WhenMissing f k x (a -> b) -> WhenMissing f k x a -> WhenMissing f k x b #

liftA2 :: (a -> b -> c) -> WhenMissing f k x a -> WhenMissing f k x b -> WhenMissing f k x c #

(*>) :: WhenMissing f k x a -> WhenMissing f k x b -> WhenMissing f k x b #

(<*) :: WhenMissing f k x a -> WhenMissing f k x b -> WhenMissing f k x a #

(Monad m, Monoid s, Monoid w) => Applicative (FocusingWith w m s) 
Instance details

Defined in Lens.Micro.Mtl.Internal

Methods

pure :: a -> FocusingWith w m s a #

(<*>) :: FocusingWith w m s (a -> b) -> FocusingWith w m s a -> FocusingWith w m s b #

liftA2 :: (a -> b -> c) -> FocusingWith w m s a -> FocusingWith w m s b -> FocusingWith w m s c #

(*>) :: FocusingWith w m s a -> FocusingWith w m s b -> FocusingWith w m s b #

(<*) :: FocusingWith w m s a -> FocusingWith w m s b -> FocusingWith w m s a #

Applicative (k (s, w)) => Applicative (FocusingPlus w k s) 
Instance details

Defined in Lens.Micro.Mtl.Internal

Methods

pure :: a -> FocusingPlus w k s a #

(<*>) :: FocusingPlus w k s (a -> b) -> FocusingPlus w k s a -> FocusingPlus w k s b #

liftA2 :: (a -> b -> c) -> FocusingPlus w k s a -> FocusingPlus w k s b -> FocusingPlus w k s c #

(*>) :: FocusingPlus w k s a -> FocusingPlus w k s b -> FocusingPlus w k s b #

(<*) :: FocusingPlus w k s a -> FocusingPlus w k s b -> FocusingPlus w k s a #

Applicative (k (f s)) => Applicative (FocusingOn f k s) 
Instance details

Defined in Lens.Micro.Mtl.Internal

Methods

pure :: a -> FocusingOn f k s a #

(<*>) :: FocusingOn f k s (a -> b) -> FocusingOn f k s a -> FocusingOn f k s b #

liftA2 :: (a -> b -> c) -> FocusingOn f k s a -> FocusingOn f k s b -> FocusingOn f k s c #

(*>) :: FocusingOn f k s a -> FocusingOn f k s b -> FocusingOn f k s b #

(<*) :: FocusingOn f k s a -> FocusingOn f k s b -> FocusingOn f k s a #

Applicative (k (Err e s)) => Applicative (FocusingErr e k s) 
Instance details

Defined in Lens.Micro.Mtl.Internal

Methods

pure :: a -> FocusingErr e k s a #

(<*>) :: FocusingErr e k s (a -> b) -> FocusingErr e k s a -> FocusingErr e k s b #

liftA2 :: (a -> b -> c) -> FocusingErr e k s a -> FocusingErr e k s b -> FocusingErr e k s c #

(*>) :: FocusingErr e k s a -> FocusingErr e k s b -> FocusingErr e k s b #

(<*) :: FocusingErr e k s a -> FocusingErr e k s b -> FocusingErr e k s a #

Applicative f => Applicative (M1 i c f)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

pure :: a -> M1 i c f a #

(<*>) :: M1 i c f (a -> b) -> M1 i c f a -> M1 i c f b #

liftA2 :: (a -> b -> c0) -> M1 i c f a -> M1 i c f b -> M1 i c f c0 #

(*>) :: M1 i c f a -> M1 i c f b -> M1 i c f b #

(<*) :: M1 i c f a -> M1 i c f b -> M1 i c f a #

(Applicative f, Applicative g) => Applicative (f :.: g)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

pure :: a -> (f :.: g) a #

(<*>) :: (f :.: g) (a -> b) -> (f :.: g) a -> (f :.: g) b #

liftA2 :: (a -> b -> c) -> (f :.: g) a -> (f :.: g) b -> (f :.: g) c #

(*>) :: (f :.: g) a -> (f :.: g) b -> (f :.: g) b #

(<*) :: (f :.: g) a -> (f :.: g) b -> (f :.: g) a #

(Applicative f, Applicative g) => Applicative (Compose f g)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Compose

Methods

pure :: a -> Compose f g a #

(<*>) :: Compose f g (a -> b) -> Compose f g a -> Compose f g b #

liftA2 :: (a -> b -> c) -> Compose f g a -> Compose f g b -> Compose f g c #

(*>) :: Compose f g a -> Compose f g b -> Compose f g b #

(<*) :: Compose f g a -> Compose f g b -> Compose f g a #

(Monad f, Applicative f) => Applicative (WhenMatched f k x y)

Equivalent to ReaderT k (ReaderT x (ReaderT y (MaybeT f)))

Since: containers-0.5.9

Instance details

Defined in Data.Map.Internal

Methods

pure :: a -> WhenMatched f k x y a #

(<*>) :: WhenMatched f k x y (a -> b) -> WhenMatched f k x y a -> WhenMatched f k x y b #

liftA2 :: (a -> b -> c) -> WhenMatched f k x y a -> WhenMatched f k x y b -> WhenMatched f k x y c #

(*>) :: WhenMatched f k x y a -> WhenMatched f k x y b -> WhenMatched f k x y b #

(<*) :: WhenMatched f k x y a -> WhenMatched f k x y b -> WhenMatched f k x y a #

(Monoid s, Monoid w, Monad m) => Applicative (EffectRWS w st m s) 
Instance details

Defined in Lens.Micro.Mtl.Internal

Methods

pure :: a -> EffectRWS w st m s a #

(<*>) :: EffectRWS w st m s (a -> b) -> EffectRWS w st m s a -> EffectRWS w st m s b #

liftA2 :: (a -> b -> c) -> EffectRWS w st m s a -> EffectRWS w st m s b -> EffectRWS w st m s c #

(*>) :: EffectRWS w st m s a -> EffectRWS w st m s b -> EffectRWS w st m s b #

(<*) :: EffectRWS w st m s a -> EffectRWS w st m s b -> EffectRWS w st m s a #

Reifies s (ReifiedApplicative f) => Applicative (ReflectedApplicative f s) 
Instance details

Defined in Data.Reflection

(Applicative f, Applicative g) => Applicative (Compose f g) 
Instance details

Defined in Data.Vinyl.Functor

Methods

pure :: a -> Compose f g a #

(<*>) :: Compose f g (a -> b) -> Compose f g a -> Compose f g b #

liftA2 :: (a -> b -> c) -> Compose f g a -> Compose f g b -> Compose f g c #

(*>) :: Compose f g a -> Compose f g b -> Compose f g b #

(<*) :: Compose f g a -> Compose f g b -> Compose f g a #

Monad state => Applicative (Builder collection mutCollection step state err) 
Instance details

Defined in Basement.MutableBuilder

Methods

pure :: a -> Builder collection mutCollection step state err a #

(<*>) :: Builder collection mutCollection step state err (a -> b) -> Builder collection mutCollection step state err a -> Builder collection mutCollection step state err b #

liftA2 :: (a -> b -> c) -> Builder collection mutCollection step state err a -> Builder collection mutCollection step state err b -> Builder collection mutCollection step state err c #

(*>) :: Builder collection mutCollection step state err a -> Builder collection mutCollection step state err b -> Builder collection mutCollection step state err b #

(<*) :: Builder collection mutCollection step state err a -> Builder collection mutCollection step state err b -> Builder collection mutCollection step state err a #

(Applicative f, Applicative g) => Applicative (Lift (,) f g) 
Instance details

Defined in Data.Vinyl.Functor

Methods

pure :: a -> Lift (,) f g a #

(<*>) :: Lift (,) f g (a -> b) -> Lift (,) f g a -> Lift (,) f g b #

liftA2 :: (a -> b -> c) -> Lift (,) f g a -> Lift (,) f g b -> Lift (,) f g c #

(*>) :: Lift (,) f g a -> Lift (,) f g b -> Lift (,) f g b #

(<*) :: Lift (,) f g a -> Lift (,) f g b -> Lift (,) f g a #

class Foldable (t :: Type -> Type) #

Data structures that can be folded.

For example, given a data type

data Tree a = Empty | Leaf a | Node (Tree a) a (Tree a)

a suitable instance would be

instance Foldable Tree where
   foldMap f Empty = mempty
   foldMap f (Leaf x) = f x
   foldMap f (Node l k r) = foldMap f l `mappend` f k `mappend` foldMap f r

This is suitable even for abstract types, as the monoid is assumed to satisfy the monoid laws. Alternatively, one could define foldr:

instance Foldable Tree where
   foldr f z Empty = z
   foldr f z (Leaf x) = f x z
   foldr f z (Node l k r) = foldr f (f k (foldr f z r)) l

Foldable instances are expected to satisfy the following laws:

foldr f z t = appEndo (foldMap (Endo . f) t ) z
foldl f z t = appEndo (getDual (foldMap (Dual . Endo . flip f) t)) z
fold = foldMap id
length = getSum . foldMap (Sum . const  1)

sum, product, maximum, and minimum should all be essentially equivalent to foldMap forms, such as

sum = getSum . foldMap Sum

but may be less defined.

If the type is also a Functor instance, it should satisfy

foldMap f = fold . fmap f

which implies that

foldMap f . fmap g = foldMap (f . g)

Minimal complete definition

foldMap | foldr

Instances

Instances details
Foldable []

Since: base-2.1

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => [m] -> m #

foldMap :: Monoid m => (a -> m) -> [a] -> m #

foldMap' :: Monoid m => (a -> m) -> [a] -> m #

foldr :: (a -> b -> b) -> b -> [a] -> b #

foldr' :: (a -> b -> b) -> b -> [a] -> b #

foldl :: (b -> a -> b) -> b -> [a] -> b #

foldl' :: (b -> a -> b) -> b -> [a] -> b #

foldr1 :: (a -> a -> a) -> [a] -> a #

foldl1 :: (a -> a -> a) -> [a] -> a #

toList :: [a] -> [a] #

null :: [a] -> Bool #

length :: [a] -> Int #

elem :: Eq a => a -> [a] -> Bool #

maximum :: Ord a => [a] -> a #

minimum :: Ord a => [a] -> a #

sum :: Num a => [a] -> a #

product :: Num a => [a] -> 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 #

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 #

Foldable Par1

Since: base-4.9.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => Par1 m -> m #

foldMap :: Monoid m => (a -> m) -> Par1 a -> m #

foldMap' :: Monoid m => (a -> m) -> Par1 a -> m #

foldr :: (a -> b -> b) -> b -> Par1 a -> b #

foldr' :: (a -> b -> b) -> b -> Par1 a -> b #

foldl :: (b -> a -> b) -> b -> Par1 a -> b #

foldl' :: (b -> a -> b) -> b -> Par1 a -> b #

foldr1 :: (a -> a -> a) -> Par1 a -> a #

foldl1 :: (a -> a -> a) -> Par1 a -> a #

toList :: Par1 a -> [a] #

null :: Par1 a -> Bool #

length :: Par1 a -> Int #

elem :: Eq a => a -> Par1 a -> Bool #

maximum :: Ord a => Par1 a -> a #

minimum :: Ord a => Par1 a -> a #

sum :: Num a => Par1 a -> a #

product :: Num a => Par1 a -> a #

Foldable IResult 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

fold :: Monoid m => IResult m -> m #

foldMap :: Monoid m => (a -> m) -> IResult a -> m #

foldMap' :: Monoid m => (a -> m) -> IResult a -> m #

foldr :: (a -> b -> b) -> b -> IResult a -> b #

foldr' :: (a -> b -> b) -> b -> IResult a -> b #

foldl :: (b -> a -> b) -> b -> IResult a -> b #

foldl' :: (b -> a -> b) -> b -> IResult a -> b #

foldr1 :: (a -> a -> a) -> IResult a -> a #

foldl1 :: (a -> a -> a) -> IResult a -> a #

toList :: IResult a -> [a] #

null :: IResult a -> Bool #

length :: IResult a -> Int #

elem :: Eq a => a -> IResult a -> Bool #

maximum :: Ord a => IResult a -> a #

minimum :: Ord a => IResult a -> a #

sum :: Num a => IResult a -> a #

product :: Num a => IResult a -> a #

Foldable Result 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

fold :: Monoid m => Result m -> m #

foldMap :: Monoid m => (a -> m) -> Result a -> m #

foldMap' :: Monoid m => (a -> m) -> Result a -> m #

foldr :: (a -> b -> b) -> b -> Result a -> b #

foldr' :: (a -> b -> b) -> b -> Result a -> b #

foldl :: (b -> a -> b) -> b -> Result a -> b #

foldl' :: (b -> a -> b) -> b -> Result a -> b #

foldr1 :: (a -> a -> a) -> Result a -> a #

foldl1 :: (a -> a -> a) -> Result a -> a #

toList :: Result a -> [a] #

null :: Result a -> Bool #

length :: Result a -> Int #

elem :: Eq a => a -> Result a -> Bool #

maximum :: Ord a => Result a -> a #

minimum :: Ord a => Result a -> a #

sum :: Num a => Result a -> a #

product :: Num a => Result a -> a #

Foldable Complex

Since: base-4.9.0.0

Instance details

Defined in Data.Complex

Methods

fold :: Monoid m => Complex m -> m #

foldMap :: Monoid m => (a -> m) -> Complex a -> m #

foldMap' :: Monoid m => (a -> m) -> Complex a -> m #

foldr :: (a -> b -> b) -> b -> Complex a -> b #

foldr' :: (a -> b -> b) -> b -> Complex a -> b #

foldl :: (b -> a -> b) -> b -> Complex a -> b #

foldl' :: (b -> a -> b) -> b -> Complex a -> b #

foldr1 :: (a -> a -> a) -> Complex a -> a #

foldl1 :: (a -> a -> a) -> Complex a -> a #

toList :: Complex a -> [a] #

null :: Complex a -> Bool #

length :: Complex a -> Int #

elem :: Eq a => a -> Complex a -> Bool #

maximum :: Ord a => Complex a -> a #

minimum :: Ord a => Complex a -> a #

sum :: Num a => Complex a -> a #

product :: Num a => Complex a -> a #

Foldable Min

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

fold :: Monoid m => Min m -> m #

foldMap :: Monoid m => (a -> m) -> Min a -> m #

foldMap' :: Monoid m => (a -> m) -> Min a -> m #

foldr :: (a -> b -> b) -> b -> Min a -> b #

foldr' :: (a -> b -> b) -> b -> Min a -> b #

foldl :: (b -> a -> b) -> b -> Min a -> b #

foldl' :: (b -> a -> b) -> b -> Min a -> b #

foldr1 :: (a -> a -> a) -> Min a -> a #

foldl1 :: (a -> a -> a) -> Min a -> a #

toList :: Min a -> [a] #

null :: Min a -> Bool #

length :: Min a -> Int #

elem :: Eq a => a -> Min a -> Bool #

maximum :: Ord a => Min a -> a #

minimum :: Ord a => Min a -> a #

sum :: Num a => Min a -> a #

product :: Num a => Min a -> a #

Foldable Max

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

fold :: Monoid m => Max m -> m #

foldMap :: Monoid m => (a -> m) -> Max a -> m #

foldMap' :: Monoid m => (a -> m) -> Max a -> m #

foldr :: (a -> b -> b) -> b -> Max a -> b #

foldr' :: (a -> b -> b) -> b -> Max a -> b #

foldl :: (b -> a -> b) -> b -> Max a -> b #

foldl' :: (b -> a -> b) -> b -> Max a -> b #

foldr1 :: (a -> a -> a) -> Max a -> a #

foldl1 :: (a -> a -> a) -> Max a -> a #

toList :: Max a -> [a] #

null :: Max a -> Bool #

length :: Max a -> Int #

elem :: Eq a => a -> Max a -> Bool #

maximum :: Ord a => Max a -> a #

minimum :: Ord a => Max a -> a #

sum :: Num a => Max a -> a #

product :: Num a => Max a -> a #

Foldable First

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

fold :: Monoid m => First m -> m #

foldMap :: Monoid m => (a -> m) -> First a -> 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 #

Foldable Last

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

fold :: Monoid m => Last m -> m #

foldMap :: Monoid m => (a -> m) -> Last a -> 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 #

Foldable Option

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

fold :: Monoid m => Option m -> m #

foldMap :: Monoid m => (a -> m) -> Option a -> m #

foldMap' :: Monoid m => (a -> m) -> Option a -> m #

foldr :: (a -> b -> b) -> b -> Option a -> b #

foldr' :: (a -> b -> b) -> b -> Option a -> b #

foldl :: (b -> a -> b) -> b -> Option a -> b #

foldl' :: (b -> a -> b) -> b -> Option a -> b #

foldr1 :: (a -> a -> a) -> Option a -> a #

foldl1 :: (a -> a -> a) -> Option a -> a #

toList :: Option a -> [a] #

null :: Option a -> Bool #

length :: Option a -> Int #

elem :: Eq a => a -> Option a -> Bool #

maximum :: Ord a => Option a -> a #

minimum :: Ord a => Option a -> a #

sum :: Num a => Option a -> a #

product :: Num a => Option a -> a #

Foldable ZipList

Since: base-4.9.0.0

Instance details

Defined in Control.Applicative

Methods

fold :: Monoid m => ZipList m -> m #

foldMap :: Monoid m => (a -> m) -> ZipList a -> m #

foldMap' :: Monoid m => (a -> m) -> ZipList a -> m #

foldr :: (a -> b -> b) -> b -> ZipList a -> b #

foldr' :: (a -> b -> b) -> b -> ZipList a -> b #

foldl :: (b -> a -> b) -> b -> ZipList a -> b #

foldl' :: (b -> a -> b) -> b -> ZipList a -> b #

foldr1 :: (a -> a -> a) -> ZipList a -> a #

foldl1 :: (a -> a -> a) -> ZipList a -> a #

toList :: ZipList a -> [a] #

null :: ZipList a -> Bool #

length :: ZipList a -> Int #

elem :: Eq a => a -> ZipList a -> Bool #

maximum :: Ord a => ZipList a -> a #

minimum :: Ord a => ZipList a -> a #

sum :: Num a => ZipList a -> a #

product :: Num a => ZipList a -> a #

Foldable Identity

Since: base-4.8.0.0

Instance details

Defined in Data.Functor.Identity

Methods

fold :: Monoid m => Identity m -> m #

foldMap :: Monoid m => (a -> m) -> Identity a -> m #

foldMap' :: Monoid m => (a -> m) -> Identity a -> m #

foldr :: (a -> b -> b) -> b -> Identity a -> b #

foldr' :: (a -> b -> b) -> b -> Identity a -> b #

foldl :: (b -> a -> b) -> b -> Identity a -> b #

foldl' :: (b -> a -> b) -> b -> Identity a -> b #

foldr1 :: (a -> a -> a) -> Identity a -> a #

foldl1 :: (a -> a -> a) -> Identity a -> a #

toList :: Identity a -> [a] #

null :: Identity a -> Bool #

length :: Identity a -> Int #

elem :: Eq a => a -> Identity a -> Bool #

maximum :: Ord a => Identity a -> a #

minimum :: Ord a => Identity a -> a #

sum :: Num a => Identity a -> a #

product :: Num a => Identity a -> 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 #

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 #

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 #

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 #

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 #

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 #

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 #

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 #

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 #

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 #

Foldable Down

Since: base-4.12.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => Down m -> m #

foldMap :: Monoid m => (a -> m) -> Down a -> m #

foldMap' :: Monoid m => (a -> m) -> Down a -> m #

foldr :: (a -> b -> b) -> b -> Down a -> b #

foldr' :: (a -> b -> b) -> b -> Down a -> b #

foldl :: (b -> a -> b) -> b -> Down a -> b #

foldl' :: (b -> a -> b) -> b -> Down a -> b #

foldr1 :: (a -> a -> a) -> Down a -> a #

foldl1 :: (a -> a -> a) -> Down a -> a #

toList :: Down a -> [a] #

null :: Down a -> Bool #

length :: Down a -> Int #

elem :: Eq a => a -> Down a -> Bool #

maximum :: Ord a => Down a -> a #

minimum :: Ord a => Down a -> a #

sum :: Num a => Down a -> a #

product :: Num a => Down a -> a #

Foldable NonEmpty

Since: base-4.9.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => NonEmpty m -> m #

foldMap :: Monoid m => (a -> m) -> NonEmpty a -> m #

foldMap' :: Monoid m => (a -> m) -> NonEmpty a -> m #

foldr :: (a -> b -> b) -> b -> NonEmpty a -> b #

foldr' :: (a -> b -> b) -> b -> NonEmpty a -> b #

foldl :: (b -> a -> b) -> b -> NonEmpty a -> b #

foldl' :: (b -> a -> b) -> b -> NonEmpty a -> b #

foldr1 :: (a -> a -> a) -> NonEmpty a -> a #

foldl1 :: (a -> a -> a) -> NonEmpty a -> a #

toList :: NonEmpty a -> [a] #

null :: NonEmpty a -> Bool #

length :: NonEmpty a -> Int #

elem :: Eq a => a -> NonEmpty a -> Bool #

maximum :: Ord a => NonEmpty a -> a #

minimum :: Ord a => NonEmpty a -> a #

sum :: Num a => NonEmpty a -> a #

product :: Num a => NonEmpty a -> a #

Foldable IntMap

Folds in order of increasing key.

Instance details

Defined in Data.IntMap.Internal

Methods

fold :: Monoid m => IntMap m -> m #

foldMap :: Monoid m => (a -> m) -> IntMap a -> m #

foldMap' :: Monoid m => (a -> m) -> IntMap a -> m #

foldr :: (a -> b -> b) -> b -> IntMap a -> b #

foldr' :: (a -> b -> b) -> b -> IntMap a -> b #

foldl :: (b -> a -> b) -> b -> IntMap a -> b #

foldl' :: (b -> a -> b) -> b -> IntMap a -> b #

foldr1 :: (a -> a -> a) -> IntMap a -> a #

foldl1 :: (a -> a -> a) -> IntMap a -> a #

toList :: IntMap a -> [a] #

null :: IntMap a -> Bool #

length :: IntMap a -> Int #

elem :: Eq a => a -> IntMap a -> Bool #

maximum :: Ord a => IntMap a -> a #

minimum :: Ord a => IntMap a -> a #

sum :: Num a => IntMap a -> a #

product :: Num a => IntMap a -> a #

Foldable Tree 
Instance details

Defined in Data.Tree

Methods

fold :: Monoid m => Tree m -> m #

foldMap :: Monoid m => (a -> m) -> Tree a -> m #

foldMap' :: Monoid m => (a -> m) -> Tree a -> m #

foldr :: (a -> b -> b) -> b -> Tree a -> b #

foldr' :: (a -> b -> b) -> b -> Tree a -> b #

foldl :: (b -> a -> b) -> b -> Tree a -> b #

foldl' :: (b -> a -> b) -> b -> Tree a -> b #

foldr1 :: (a -> a -> a) -> Tree a -> a #

foldl1 :: (a -> a -> a) -> Tree a -> a #

toList :: Tree a -> [a] #

null :: Tree a -> Bool #

length :: Tree a -> Int #

elem :: Eq a => a -> Tree a -> Bool #

maximum :: Ord a => Tree a -> a #

minimum :: Ord a => Tree a -> a #

sum :: Num a => Tree a -> a #

product :: Num a => Tree a -> a #

Foldable Seq 
Instance details

Defined in Data.Sequence.Internal

Methods

fold :: Monoid m => Seq m -> m #

foldMap :: Monoid m => (a -> m) -> Seq a -> m #

foldMap' :: Monoid m => (a -> m) -> Seq a -> m #

foldr :: (a -> b -> b) -> b -> Seq a -> b #

foldr' :: (a -> b -> b) -> b -> Seq a -> b #

foldl :: (b -> a -> b) -> b -> Seq a -> b #

foldl' :: (b -> a -> b) -> b -> Seq a -> b #

foldr1 :: (a -> a -> a) -> Seq a -> a #

foldl1 :: (a -> a -> a) -> Seq a -> a #

toList :: Seq a -> [a] #

null :: Seq a -> Bool #

length :: Seq a -> Int #

elem :: Eq a => a -> Seq a -> Bool #

maximum :: Ord a => Seq a -> a #

minimum :: Ord a => Seq a -> a #

sum :: Num a => Seq a -> a #

product :: Num a => Seq a -> a #

Foldable FingerTree 
Instance details

Defined in Data.Sequence.Internal

Methods

fold :: Monoid m => FingerTree m -> m #

foldMap :: Monoid m => (a -> m) -> FingerTree a -> m #

foldMap' :: Monoid m => (a -> m) -> FingerTree a -> m #

foldr :: (a -> b -> b) -> b -> FingerTree a -> b #

foldr' :: (a -> b -> b) -> b -> FingerTree a -> b #

foldl :: (b -> a -> b) -> b -> FingerTree a -> b #

foldl' :: (b -> a -> b) -> b -> FingerTree a -> b #

foldr1 :: (a -> a -> a) -> FingerTree a -> a #

foldl1 :: (a -> a -> a) -> FingerTree a -> a #

toList :: FingerTree a -> [a] #

null :: FingerTree a -> Bool #

length :: FingerTree a -> Int #

elem :: Eq a => a -> FingerTree a -> Bool #

maximum :: Ord a => FingerTree a -> a #

minimum :: Ord a => FingerTree a -> a #

sum :: Num a => FingerTree a -> a #

product :: Num a => FingerTree a -> a #

Foldable Digit 
Instance details

Defined in Data.Sequence.Internal

Methods

fold :: Monoid m => Digit m -> m #

foldMap :: Monoid m => (a -> m) -> Digit a -> m #

foldMap' :: Monoid m => (a -> m) -> Digit a -> m #

foldr :: (a -> b -> b) -> b -> Digit a -> b #

foldr' :: (a -> b -> b) -> b -> Digit a -> b #

foldl :: (b -> a -> b) -> b -> Digit a -> b #

foldl' :: (b -> a -> b) -> b -> Digit a -> b #

foldr1 :: (a -> a -> a) -> Digit a -> a #

foldl1 :: (a -> a -> a) -> Digit a -> a #

toList :: Digit a -> [a] #

null :: Digit a -> Bool #

length :: Digit a -> Int #

elem :: Eq a => a -> Digit a -> Bool #

maximum :: Ord a => Digit a -> a #

minimum :: Ord a => Digit a -> a #

sum :: Num a => Digit a -> a #

product :: Num a => Digit a -> a #

Foldable Node 
Instance details

Defined in Data.Sequence.Internal

Methods

fold :: Monoid m => Node m -> m #

foldMap :: Monoid m => (a -> m) -> Node a -> m #

foldMap' :: Monoid m => (a -> m) -> Node a -> m #

foldr :: (a -> b -> b) -> b -> Node a -> b #

foldr' :: (a -> b -> b) -> b -> Node a -> b #

foldl :: (b -> a -> b) -> b -> Node a -> b #

foldl' :: (b -> a -> b) -> b -> Node a -> b #

foldr1 :: (a -> a -> a) -> Node a -> a #

foldl1 :: (a -> a -> a) -> Node a -> a #

toList :: Node a -> [a] #

null :: Node a -> Bool #

length :: Node a -> Int #

elem :: Eq a => a -> Node a -> Bool #

maximum :: Ord a => Node a -> a #

minimum :: Ord a => Node a -> a #

sum :: Num a => Node a -> a #

product :: Num a => Node a -> a #

Foldable Elem 
Instance details

Defined in Data.Sequence.Internal

Methods

fold :: Monoid m => Elem m -> m #

foldMap :: Monoid m => (a -> m) -> Elem a -> m #

foldMap' :: Monoid m => (a -> m) -> Elem a -> m #

foldr :: (a -> b -> b) -> b -> Elem a -> b #

foldr' :: (a -> b -> b) -> b -> Elem a -> b #

foldl :: (b -> a -> b) -> b -> Elem a -> b #

foldl' :: (b -> a -> b) -> b -> Elem a -> b #

foldr1 :: (a -> a -> a) -> Elem a -> a #

foldl1 :: (a -> a -> a) -> Elem a -> a #

toList :: Elem a -> [a] #

null :: Elem a -> Bool #

length :: Elem a -> Int #

elem :: Eq a => a -> Elem a -> Bool #

maximum :: Ord a => Elem a -> a #

minimum :: Ord a => Elem a -> a #

sum :: Num a => Elem a -> a #

product :: Num a => Elem a -> a #

Foldable ViewL 
Instance details

Defined in Data.Sequence.Internal

Methods

fold :: Monoid m => ViewL m -> m #

foldMap :: Monoid m => (a -> m) -> ViewL a -> m #

foldMap' :: Monoid m => (a -> m) -> ViewL a -> m #

foldr :: (a -> b -> b) -> b -> ViewL a -> b #

foldr' :: (a -> b -> b) -> b -> ViewL a -> b #

foldl :: (b -> a -> b) -> b -> ViewL a -> b #

foldl' :: (b -> a -> b) -> b -> ViewL a -> b #

foldr1 :: (a -> a -> a) -> ViewL a -> a #

foldl1 :: (a -> a -> a) -> ViewL a -> a #

toList :: ViewL a -> [a] #

null :: ViewL a -> Bool #

length :: ViewL a -> Int #

elem :: Eq a => a -> ViewL a -> Bool #

maximum :: Ord a => ViewL a -> a #

minimum :: Ord a => ViewL a -> a #

sum :: Num a => ViewL a -> a #

product :: Num a => ViewL a -> a #

Foldable ViewR 
Instance details

Defined in Data.Sequence.Internal

Methods

fold :: Monoid m => ViewR m -> m #

foldMap :: Monoid m => (a -> m) -> ViewR a -> m #

foldMap' :: Monoid m => (a -> m) -> ViewR a -> m #

foldr :: (a -> b -> b) -> b -> ViewR a -> b #

foldr' :: (a -> b -> b) -> b -> ViewR a -> b #

foldl :: (b -> a -> b) -> b -> ViewR a -> b #

foldl' :: (b -> a -> b) -> b -> ViewR a -> b #

foldr1 :: (a -> a -> a) -> ViewR a -> a #

foldl1 :: (a -> a -> a) -> ViewR a -> a #

toList :: ViewR a -> [a] #

null :: ViewR a -> Bool #

length :: ViewR a -> Int #

elem :: Eq a => a -> ViewR a -> Bool #

maximum :: Ord a => ViewR a -> a #

minimum :: Ord a => ViewR a -> a #

sum :: Num a => ViewR a -> a #

product :: Num a => ViewR a -> a #

Foldable Set

Folds in order of increasing key.

Instance details

Defined in Data.Set.Internal

Methods

fold :: Monoid m => Set m -> m #

foldMap :: Monoid m => (a -> m) -> Set a -> m #

foldMap' :: Monoid m => (a -> m) -> Set a -> m #

foldr :: (a -> b -> b) -> b -> Set a -> b #

foldr' :: (a -> b -> b) -> b -> Set a -> b #

foldl :: (b -> a -> b) -> b -> Set a -> b #

foldl' :: (b -> a -> b) -> b -> Set a -> b #

foldr1 :: (a -> a -> a) -> Set a -> a #

foldl1 :: (a -> a -> a) -> Set a -> a #

toList :: Set a -> [a] #

null :: Set a -> Bool #

length :: Set a -> Int #

elem :: Eq a => a -> Set a -> Bool #

maximum :: Ord a => Set a -> a #

minimum :: Ord a => Set a -> a #

sum :: Num a => Set a -> a #

product :: Num a => Set a -> a #

Foldable DList 
Instance details

Defined in Data.DList

Methods

fold :: Monoid m => DList m -> m #

foldMap :: Monoid m => (a -> m) -> DList a -> m #

foldMap' :: Monoid m => (a -> m) -> DList a -> m #

foldr :: (a -> b -> b) -> b -> DList a -> b #

foldr' :: (a -> b -> b) -> b -> DList a -> b #

foldl :: (b -> a -> b) -> b -> DList a -> b #

foldl' :: (b -> a -> b) -> b -> DList a -> b #

foldr1 :: (a -> a -> a) -> DList a -> a #

foldl1 :: (a -> a -> a) -> DList a -> a #

toList :: DList a -> [a] #

null :: DList a -> Bool #

length :: DList a -> Int #

elem :: Eq a => a -> DList a -> Bool #

maximum :: Ord a => DList a -> a #

minimum :: Ord a => DList a -> a #

sum :: Num a => DList a -> a #

product :: Num a => DList a -> a #

Foldable Hashed 
Instance details

Defined in Data.Hashable.Class

Methods

fold :: Monoid m => Hashed m -> m #

foldMap :: Monoid m => (a -> m) -> Hashed a -> m #

foldMap' :: Monoid m => (a -> m) -> Hashed a -> m #

foldr :: (a -> b -> b) -> b -> Hashed a -> b #

foldr' :: (a -> b -> b) -> b -> Hashed a -> b #

foldl :: (b -> a -> b) -> b -> Hashed a -> b #

foldl' :: (b -> a -> b) -> b -> Hashed a -> b #

foldr1 :: (a -> a -> a) -> Hashed a -> a #

foldl1 :: (a -> a -> a) -> Hashed a -> a #

toList :: Hashed a -> [a] #

null :: Hashed a -> Bool #

length :: Hashed a -> Int #

elem :: Eq a => a -> Hashed a -> Bool #

maximum :: Ord a => Hashed a -> a #

minimum :: Ord a => Hashed a -> a #

sum :: Num a => Hashed a -> a #

product :: Num a => Hashed a -> a #

Foldable ModuleName 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => ModuleName m -> m #

foldMap :: Monoid m => (a -> m) -> ModuleName a -> m #

foldMap' :: Monoid m => (a -> m) -> ModuleName a -> m #

foldr :: (a -> b -> b) -> b -> ModuleName a -> b #

foldr' :: (a -> b -> b) -> b -> ModuleName a -> b #

foldl :: (b -> a -> b) -> b -> ModuleName a -> b #

foldl' :: (b -> a -> b) -> b -> ModuleName a -> b #

foldr1 :: (a -> a -> a) -> ModuleName a -> a #

foldl1 :: (a -> a -> a) -> ModuleName a -> a #

toList :: ModuleName a -> [a] #

null :: ModuleName a -> Bool #

length :: ModuleName a -> Int #

elem :: Eq a => a -> ModuleName a -> Bool #

maximum :: Ord a => ModuleName a -> a #

minimum :: Ord a => ModuleName a -> a #

sum :: Num a => ModuleName a -> a #

product :: Num a => ModuleName a -> a #

Foldable SpecialCon 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => SpecialCon m -> m #

foldMap :: Monoid m => (a -> m) -> SpecialCon a -> m #

foldMap' :: Monoid m => (a -> m) -> SpecialCon a -> m #

foldr :: (a -> b -> b) -> b -> SpecialCon a -> b #

foldr' :: (a -> b -> b) -> b -> SpecialCon a -> b #

foldl :: (b -> a -> b) -> b -> SpecialCon a -> b #

foldl' :: (b -> a -> b) -> b -> SpecialCon a -> b #

foldr1 :: (a -> a -> a) -> SpecialCon a -> a #

foldl1 :: (a -> a -> a) -> SpecialCon a -> a #

toList :: SpecialCon a -> [a] #

null :: SpecialCon a -> Bool #

length :: SpecialCon a -> Int #

elem :: Eq a => a -> SpecialCon a -> Bool #

maximum :: Ord a => SpecialCon a -> a #

minimum :: Ord a => SpecialCon a -> a #

sum :: Num a => SpecialCon a -> a #

product :: Num a => SpecialCon a -> a #

Foldable QName 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => QName m -> m #

foldMap :: Monoid m => (a -> m) -> QName a -> m #

foldMap' :: Monoid m => (a -> m) -> QName a -> m #

foldr :: (a -> b -> b) -> b -> QName a -> b #

foldr' :: (a -> b -> b) -> b -> QName a -> b #

foldl :: (b -> a -> b) -> b -> QName a -> b #

foldl' :: (b -> a -> b) -> b -> QName a -> b #

foldr1 :: (a -> a -> a) -> QName a -> a #

foldl1 :: (a -> a -> a) -> QName a -> a #

toList :: QName a -> [a] #

null :: QName a -> Bool #

length :: QName a -> Int #

elem :: Eq a => a -> QName a -> Bool #

maximum :: Ord a => QName a -> a #

minimum :: Ord a => QName a -> a #

sum :: Num a => QName a -> a #

product :: Num a => QName a -> a #

Foldable Name 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => Name m -> m #

foldMap :: Monoid m => (a -> m) -> Name a -> m #

foldMap' :: Monoid m => (a -> m) -> Name a -> m #

foldr :: (a -> b -> b) -> b -> Name a -> b #

foldr' :: (a -> b -> b) -> b -> Name a -> b #

foldl :: (b -> a -> b) -> b -> Name a -> b #

foldl' :: (b -> a -> b) -> b -> Name a -> b #

foldr1 :: (a -> a -> a) -> Name a -> a #

foldl1 :: (a -> a -> a) -> Name a -> a #

toList :: Name a -> [a] #

null :: Name a -> Bool #

length :: Name a -> Int #

elem :: Eq a => a -> Name a -> Bool #

maximum :: Ord a => Name a -> a #

minimum :: Ord a => Name a -> a #

sum :: Num a => Name a -> a #

product :: Num a => Name a -> a #

Foldable IPName 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => IPName m -> m #

foldMap :: Monoid m => (a -> m) -> IPName a -> m #

foldMap' :: Monoid m => (a -> m) -> IPName a -> m #

foldr :: (a -> b -> b) -> b -> IPName a -> b #

foldr' :: (a -> b -> b) -> b -> IPName a -> b #

foldl :: (b -> a -> b) -> b -> IPName a -> b #

foldl' :: (b -> a -> b) -> b -> IPName a -> b #

foldr1 :: (a -> a -> a) -> IPName a -> a #

foldl1 :: (a -> a -> a) -> IPName a -> a #

toList :: IPName a -> [a] #

null :: IPName a -> Bool #

length :: IPName a -> Int #

elem :: Eq a => a -> IPName a -> Bool #

maximum :: Ord a => IPName a -> a #

minimum :: Ord a => IPName a -> a #

sum :: Num a => IPName a -> a #

product :: Num a => IPName a -> a #

Foldable QOp 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => QOp m -> m #

foldMap :: Monoid m => (a -> m) -> QOp a -> m #

foldMap' :: Monoid m => (a -> m) -> QOp a -> m #

foldr :: (a -> b -> b) -> b -> QOp a -> b #

foldr' :: (a -> b -> b) -> b -> QOp a -> b #

foldl :: (b -> a -> b) -> b -> QOp a -> b #

foldl' :: (b -> a -> b) -> b -> QOp a -> b #

foldr1 :: (a -> a -> a) -> QOp a -> a #

foldl1 :: (a -> a -> a) -> QOp a -> a #

toList :: QOp a -> [a] #

null :: QOp a -> Bool #

length :: QOp a -> Int #

elem :: Eq a => a -> QOp a -> Bool #

maximum :: Ord a => QOp a -> a #

minimum :: Ord a => QOp a -> a #

sum :: Num a => QOp a -> a #

product :: Num a => QOp a -> a #

Foldable Op 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => Op m -> m #

foldMap :: Monoid m => (a -> m) -> Op a -> m #

foldMap' :: Monoid m => (a -> m) -> Op a -> m #

foldr :: (a -> b -> b) -> b -> Op a -> b #

foldr' :: (a -> b -> b) -> b -> Op a -> b #

foldl :: (b -> a -> b) -> b -> Op a -> b #

foldl' :: (b -> a -> b) -> b -> Op a -> b #

foldr1 :: (a -> a -> a) -> Op a -> a #

foldl1 :: (a -> a -> a) -> Op a -> a #

toList :: Op a -> [a] #

null :: Op a -> Bool #

length :: Op a -> Int #

elem :: Eq a => a -> Op a -> Bool #

maximum :: Ord a => Op a -> a #

minimum :: Ord a => Op a -> a #

sum :: Num a => Op a -> a #

product :: Num a => Op a -> a #

Foldable CName 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => CName m -> m #

foldMap :: Monoid m => (a -> m) -> CName a -> m #

foldMap' :: Monoid m => (a -> m) -> CName a -> m #

foldr :: (a -> b -> b) -> b -> CName a -> b #

foldr' :: (a -> b -> b) -> b -> CName a -> b #

foldl :: (b -> a -> b) -> b -> CName a -> b #

foldl' :: (b -> a -> b) -> b -> CName a -> b #

foldr1 :: (a -> a -> a) -> CName a -> a #

foldl1 :: (a -> a -> a) -> CName a -> a #

toList :: CName a -> [a] #

null :: CName a -> Bool #

length :: CName a -> Int #

elem :: Eq a => a -> CName a -> Bool #

maximum :: Ord a => CName a -> a #

minimum :: Ord a => CName a -> a #

sum :: Num a => CName a -> a #

product :: Num a => CName a -> a #

Foldable Module 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => Module m -> m #

foldMap :: Monoid m => (a -> m) -> Module a -> m #

foldMap' :: Monoid m => (a -> m) -> Module a -> m #

foldr :: (a -> b -> b) -> b -> Module a -> b #

foldr' :: (a -> b -> b) -> b -> Module a -> b #

foldl :: (b -> a -> b) -> b -> Module a -> b #

foldl' :: (b -> a -> b) -> b -> Module a -> b #

foldr1 :: (a -> a -> a) -> Module a -> a #

foldl1 :: (a -> a -> a) -> Module a -> a #

toList :: Module a -> [a] #

null :: Module a -> Bool #

length :: Module a -> Int #

elem :: Eq a => a -> Module a -> Bool #

maximum :: Ord a => Module a -> a #

minimum :: Ord a => Module a -> a #

sum :: Num a => Module a -> a #

product :: Num a => Module a -> a #

Foldable ModuleHead 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => ModuleHead m -> m #

foldMap :: Monoid m => (a -> m) -> ModuleHead a -> m #

foldMap' :: Monoid m => (a -> m) -> ModuleHead a -> m #

foldr :: (a -> b -> b) -> b -> ModuleHead a -> b #

foldr' :: (a -> b -> b) -> b -> ModuleHead a -> b #

foldl :: (b -> a -> b) -> b -> ModuleHead a -> b #

foldl' :: (b -> a -> b) -> b -> ModuleHead a -> b #

foldr1 :: (a -> a -> a) -> ModuleHead a -> a #

foldl1 :: (a -> a -> a) -> ModuleHead a -> a #

toList :: ModuleHead a -> [a] #

null :: ModuleHead a -> Bool #

length :: ModuleHead a -> Int #

elem :: Eq a => a -> ModuleHead a -> Bool #

maximum :: Ord a => ModuleHead a -> a #

minimum :: Ord a => ModuleHead a -> a #

sum :: Num a => ModuleHead a -> a #

product :: Num a => ModuleHead a -> a #

Foldable ExportSpecList 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => ExportSpecList m -> m #

foldMap :: Monoid m => (a -> m) -> ExportSpecList a -> m #

foldMap' :: Monoid m => (a -> m) -> ExportSpecList a -> m #

foldr :: (a -> b -> b) -> b -> ExportSpecList a -> b #

foldr' :: (a -> b -> b) -> b -> ExportSpecList a -> b #

foldl :: (b -> a -> b) -> b -> ExportSpecList a -> b #

foldl' :: (b -> a -> b) -> b -> ExportSpecList a -> b #

foldr1 :: (a -> a -> a) -> ExportSpecList a -> a #

foldl1 :: (a -> a -> a) -> ExportSpecList a -> a #

toList :: ExportSpecList a -> [a] #

null :: ExportSpecList a -> Bool #

length :: ExportSpecList a -> Int #

elem :: Eq a => a -> ExportSpecList a -> Bool #

maximum :: Ord a => ExportSpecList a -> a #

minimum :: Ord a => ExportSpecList a -> a #

sum :: Num a => ExportSpecList a -> a #

product :: Num a => ExportSpecList a -> a #

Foldable ExportSpec 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => ExportSpec m -> m #

foldMap :: Monoid m => (a -> m) -> ExportSpec a -> m #

foldMap' :: Monoid m => (a -> m) -> ExportSpec a -> m #

foldr :: (a -> b -> b) -> b -> ExportSpec a -> b #

foldr' :: (a -> b -> b) -> b -> ExportSpec a -> b #

foldl :: (b -> a -> b) -> b -> ExportSpec a -> b #

foldl' :: (b -> a -> b) -> b -> ExportSpec a -> b #

foldr1 :: (a -> a -> a) -> ExportSpec a -> a #

foldl1 :: (a -> a -> a) -> ExportSpec a -> a #

toList :: ExportSpec a -> [a] #

null :: ExportSpec a -> Bool #

length :: ExportSpec a -> Int #

elem :: Eq a => a -> ExportSpec a -> Bool #

maximum :: Ord a => ExportSpec a -> a #

minimum :: Ord a => ExportSpec a -> a #

sum :: Num a => ExportSpec a -> a #

product :: Num a => ExportSpec a -> a #

Foldable EWildcard 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => EWildcard m -> m #

foldMap :: Monoid m => (a -> m) -> EWildcard a -> m #

foldMap' :: Monoid m => (a -> m) -> EWildcard a -> m #

foldr :: (a -> b -> b) -> b -> EWildcard a -> b #

foldr' :: (a -> b -> b) -> b -> EWildcard a -> b #

foldl :: (b -> a -> b) -> b -> EWildcard a -> b #

foldl' :: (b -> a -> b) -> b -> EWildcard a -> b #

foldr1 :: (a -> a -> a) -> EWildcard a -> a #

foldl1 :: (a -> a -> a) -> EWildcard a -> a #

toList :: EWildcard a -> [a] #

null :: EWildcard a -> Bool #

length :: EWildcard a -> Int #

elem :: Eq a => a -> EWildcard a -> Bool #

maximum :: Ord a => EWildcard a -> a #

minimum :: Ord a => EWildcard a -> a #

sum :: Num a => EWildcard a -> a #

product :: Num a => EWildcard a -> a #

Foldable Namespace 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => Namespace m -> m #

foldMap :: Monoid m => (a -> m) -> Namespace a -> m #

foldMap' :: Monoid m => (a -> m) -> Namespace a -> m #

foldr :: (a -> b -> b) -> b -> Namespace a -> b #

foldr' :: (a -> b -> b) -> b -> Namespace a -> b #

foldl :: (b -> a -> b) -> b -> Namespace a -> b #

foldl' :: (b -> a -> b) -> b -> Namespace a -> b #

foldr1 :: (a -> a -> a) -> Namespace a -> a #

foldl1 :: (a -> a -> a) -> Namespace a -> a #

toList :: Namespace a -> [a] #

null :: Namespace a -> Bool #

length :: Namespace a -> Int #

elem :: Eq a => a -> Namespace a -> Bool #

maximum :: Ord a => Namespace a -> a #

minimum :: Ord a => Namespace a -> a #

sum :: Num a => Namespace a -> a #

product :: Num a => Namespace a -> a #

Foldable ImportDecl 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => ImportDecl m -> m #

foldMap :: Monoid m => (a -> m) -> ImportDecl a -> m #

foldMap' :: Monoid m => (a -> m) -> ImportDecl a -> m #

foldr :: (a -> b -> b) -> b -> ImportDecl a -> b #

foldr' :: (a -> b -> b) -> b -> ImportDecl a -> b #

foldl :: (b -> a -> b) -> b -> ImportDecl a -> b #

foldl' :: (b -> a -> b) -> b -> ImportDecl a -> b #

foldr1 :: (a -> a -> a) -> ImportDecl a -> a #

foldl1 :: (a -> a -> a) -> ImportDecl a -> a #

toList :: ImportDecl a -> [a] #

null :: ImportDecl a -> Bool #

length :: ImportDecl a -> Int #

elem :: Eq a => a -> ImportDecl a -> Bool #

maximum :: Ord a => ImportDecl a -> a #

minimum :: Ord a => ImportDecl a -> a #

sum :: Num a => ImportDecl a -> a #

product :: Num a => ImportDecl a -> a #

Foldable ImportSpecList 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => ImportSpecList m -> m #

foldMap :: Monoid m => (a -> m) -> ImportSpecList a -> m #

foldMap' :: Monoid m => (a -> m) -> ImportSpecList a -> m #

foldr :: (a -> b -> b) -> b -> ImportSpecList a -> b #

foldr' :: (a -> b -> b) -> b -> ImportSpecList a -> b #

foldl :: (b -> a -> b) -> b -> ImportSpecList a -> b #

foldl' :: (b -> a -> b) -> b -> ImportSpecList a -> b #

foldr1 :: (a -> a -> a) -> ImportSpecList a -> a #

foldl1 :: (a -> a -> a) -> ImportSpecList a -> a #

toList :: ImportSpecList a -> [a] #

null :: ImportSpecList a -> Bool #

length :: ImportSpecList a -> Int #

elem :: Eq a => a -> ImportSpecList a -> Bool #

maximum :: Ord a => ImportSpecList a -> a #

minimum :: Ord a => ImportSpecList a -> a #

sum :: Num a => ImportSpecList a -> a #

product :: Num a => ImportSpecList a -> a #

Foldable ImportSpec 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => ImportSpec m -> m #

foldMap :: Monoid m => (a -> m) -> ImportSpec a -> m #

foldMap' :: Monoid m => (a -> m) -> ImportSpec a -> m #

foldr :: (a -> b -> b) -> b -> ImportSpec a -> b #

foldr' :: (a -> b -> b) -> b -> ImportSpec a -> b #

foldl :: (b -> a -> b) -> b -> ImportSpec a -> b #

foldl' :: (b -> a -> b) -> b -> ImportSpec a -> b #

foldr1 :: (a -> a -> a) -> ImportSpec a -> a #

foldl1 :: (a -> a -> a) -> ImportSpec a -> a #

toList :: ImportSpec a -> [a] #

null :: ImportSpec a -> Bool #

length :: ImportSpec a -> Int #

elem :: Eq a => a -> ImportSpec a -> Bool #

maximum :: Ord a => ImportSpec a -> a #

minimum :: Ord a => ImportSpec a -> a #

sum :: Num a => ImportSpec a -> a #

product :: Num a => ImportSpec a -> a #

Foldable Assoc 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => Assoc m -> m #

foldMap :: Monoid m => (a -> m) -> Assoc a -> m #

foldMap' :: Monoid m => (a -> m) -> Assoc a -> m #

foldr :: (a -> b -> b) -> b -> Assoc a -> b #

foldr' :: (a -> b -> b) -> b -> Assoc a -> b #

foldl :: (b -> a -> b) -> b -> Assoc a -> b #

foldl' :: (b -> a -> b) -> b -> Assoc a -> b #

foldr1 :: (a -> a -> a) -> Assoc a -> a #

foldl1 :: (a -> a -> a) -> Assoc a -> a #

toList :: Assoc a -> [a] #

null :: Assoc a -> Bool #

length :: Assoc a -> Int #

elem :: Eq a => a -> Assoc a -> Bool #

maximum :: Ord a => Assoc a -> a #

minimum :: Ord a => Assoc a -> a #

sum :: Num a => Assoc a -> a #

product :: Num a => Assoc a -> a #

Foldable Decl 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => Decl m -> m #

foldMap :: Monoid m => (a -> m) -> Decl a -> m #

foldMap' :: Monoid m => (a -> m) -> Decl a -> m #

foldr :: (a -> b -> b) -> b -> Decl a -> b #

foldr' :: (a -> b -> b) -> b -> Decl a -> b #

foldl :: (b -> a -> b) -> b -> Decl a -> b #

foldl' :: (b -> a -> b) -> b -> Decl a -> b #

foldr1 :: (a -> a -> a) -> Decl a -> a #

foldl1 :: (a -> a -> a) -> Decl a -> a #

toList :: Decl a -> [a] #

null :: Decl a -> Bool #

length :: Decl a -> Int #

elem :: Eq a => a -> Decl a -> Bool #

maximum :: Ord a => Decl a -> a #

minimum :: Ord a => Decl a -> a #

sum :: Num a => Decl a -> a #

product :: Num a => Decl a -> a #

Foldable PatternSynDirection 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => PatternSynDirection m -> m #

foldMap :: Monoid m => (a -> m) -> PatternSynDirection a -> m #

foldMap' :: Monoid m => (a -> m) -> PatternSynDirection a -> m #

foldr :: (a -> b -> b) -> b -> PatternSynDirection a -> b #

foldr' :: (a -> b -> b) -> b -> PatternSynDirection a -> b #

foldl :: (b -> a -> b) -> b -> PatternSynDirection a -> b #

foldl' :: (b -> a -> b) -> b -> PatternSynDirection a -> b #

foldr1 :: (a -> a -> a) -> PatternSynDirection a -> a #

foldl1 :: (a -> a -> a) -> PatternSynDirection a -> a #

toList :: PatternSynDirection a -> [a] #

null :: PatternSynDirection a -> Bool #

length :: PatternSynDirection a -> Int #

elem :: Eq a => a -> PatternSynDirection a -> Bool #

maximum :: Ord a => PatternSynDirection a -> a #

minimum :: Ord a => PatternSynDirection a -> a #

sum :: Num a => PatternSynDirection a -> a #

product :: Num a => PatternSynDirection a -> a #

Foldable TypeEqn 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => TypeEqn m -> m #

foldMap :: Monoid m => (a -> m) -> TypeEqn a -> m #

foldMap' :: Monoid m => (a -> m) -> TypeEqn a -> m #

foldr :: (a -> b -> b) -> b -> TypeEqn a -> b #

foldr' :: (a -> b -> b) -> b -> TypeEqn a -> b #

foldl :: (b -> a -> b) -> b -> TypeEqn a -> b #

foldl' :: (b -> a -> b) -> b -> TypeEqn a -> b #

foldr1 :: (a -> a -> a) -> TypeEqn a -> a #

foldl1 :: (a -> a -> a) -> TypeEqn a -> a #

toList :: TypeEqn a -> [a] #

null :: TypeEqn a -> Bool #

length :: TypeEqn a -> Int #

elem :: Eq a => a -> TypeEqn a -> Bool #

maximum :: Ord a => TypeEqn a -> a #

minimum :: Ord a => TypeEqn a -> a #

sum :: Num a => TypeEqn a -> a #

product :: Num a => TypeEqn a -> a #

Foldable Annotation 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => Annotation m -> m #

foldMap :: Monoid m => (a -> m) -> Annotation a -> m #

foldMap' :: Monoid m => (a -> m) -> Annotation a -> m #

foldr :: (a -> b -> b) -> b -> Annotation a -> b #

foldr' :: (a -> b -> b) -> b -> Annotation a -> b #

foldl :: (b -> a -> b) -> b -> Annotation a -> b #

foldl' :: (b -> a -> b) -> b -> Annotation a -> b #

foldr1 :: (a -> a -> a) -> Annotation a -> a #

foldl1 :: (a -> a -> a) -> Annotation a -> a #

toList :: Annotation a -> [a] #

null :: Annotation a -> Bool #

length :: Annotation a -> Int #

elem :: Eq a => a -> Annotation a -> Bool #

maximum :: Ord a => Annotation a -> a #

minimum :: Ord a => Annotation a -> a #

sum :: Num a => Annotation a -> a #

product :: Num a => Annotation a -> a #

Foldable BooleanFormula 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => BooleanFormula m -> m #

foldMap :: Monoid m => (a -> m) -> BooleanFormula a -> m #

foldMap' :: Monoid m => (a -> m) -> BooleanFormula a -> m #

foldr :: (a -> b -> b) -> b -> BooleanFormula a -> b #

foldr' :: (a -> b -> b) -> b -> BooleanFormula a -> b #

foldl :: (b -> a -> b) -> b -> BooleanFormula a -> b #

foldl' :: (b -> a -> b) -> b -> BooleanFormula a -> b #

foldr1 :: (a -> a -> a) -> BooleanFormula a -> a #

foldl1 :: (a -> a -> a) -> BooleanFormula a -> a #

toList :: BooleanFormula a -> [a] #

null :: BooleanFormula a -> Bool #

length :: BooleanFormula a -> Int #

elem :: Eq a => a -> BooleanFormula a -> Bool #

maximum :: Ord a => BooleanFormula a -> a #

minimum :: Ord a => BooleanFormula a -> a #

sum :: Num a => BooleanFormula a -> a #

product :: Num a => BooleanFormula a -> a #

Foldable Role 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => Role m -> m #

foldMap :: Monoid m => (a -> m) -> Role a -> m #

foldMap' :: Monoid m => (a -> m) -> Role a -> m #

foldr :: (a -> b -> b) -> b -> Role a -> b #

foldr' :: (a -> b -> b) -> b -> Role a -> b #

foldl :: (b -> a -> b) -> b -> Role a -> b #

foldl' :: (b -> a -> b) -> b -> Role a -> b #

foldr1 :: (a -> a -> a) -> Role a -> a #

foldl1 :: (a -> a -> a) -> Role a -> a #

toList :: Role a -> [a] #

null :: Role a -> Bool #

length :: Role a -> Int #

elem :: Eq a => a -> Role a -> Bool #

maximum :: Ord a => Role a -> a #

minimum :: Ord a => Role a -> a #

sum :: Num a => Role a -> a #

product :: Num a => Role a -> a #

Foldable DataOrNew 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => DataOrNew m -> m #

foldMap :: Monoid m => (a -> m) -> DataOrNew a -> m #

foldMap' :: Monoid m => (a -> m) -> DataOrNew a -> m #

foldr :: (a -> b -> b) -> b -> DataOrNew a -> b #

foldr' :: (a -> b -> b) -> b -> DataOrNew a -> b #

foldl :: (b -> a -> b) -> b -> DataOrNew a -> b #

foldl' :: (b -> a -> b) -> b -> DataOrNew a -> b #

foldr1 :: (a -> a -> a) -> DataOrNew a -> a #

foldl1 :: (a -> a -> a) -> DataOrNew a -> a #

toList :: DataOrNew a -> [a] #

null :: DataOrNew a -> Bool #

length :: DataOrNew a -> Int #

elem :: Eq a => a -> DataOrNew a -> Bool #

maximum :: Ord a => DataOrNew a -> a #

minimum :: Ord a => DataOrNew a -> a #

sum :: Num a => DataOrNew a -> a #

product :: Num a => DataOrNew a -> a #

Foldable InjectivityInfo 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => InjectivityInfo m -> m #

foldMap :: Monoid m => (a -> m) -> InjectivityInfo a -> m #

foldMap' :: Monoid m => (a -> m) -> InjectivityInfo a -> m #

foldr :: (a -> b -> b) -> b -> InjectivityInfo a -> b #

foldr' :: (a -> b -> b) -> b -> InjectivityInfo a -> b #

foldl :: (b -> a -> b) -> b -> InjectivityInfo a -> b #

foldl' :: (b -> a -> b) -> b -> InjectivityInfo a -> b #

foldr1 :: (a -> a -> a) -> InjectivityInfo a -> a #

foldl1 :: (a -> a -> a) -> InjectivityInfo a -> a #

toList :: InjectivityInfo a -> [a] #

null :: InjectivityInfo a -> Bool #

length :: InjectivityInfo a -> Int #

elem :: Eq a => a -> InjectivityInfo a -> Bool #

maximum :: Ord a => InjectivityInfo a -> a #

minimum :: Ord a => InjectivityInfo a -> a #

sum :: Num a => InjectivityInfo a -> a #

product :: Num a => InjectivityInfo a -> a #

Foldable ResultSig 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => ResultSig m -> m #

foldMap :: Monoid m => (a -> m) -> ResultSig a -> m #

foldMap' :: Monoid m => (a -> m) -> ResultSig a -> m #

foldr :: (a -> b -> b) -> b -> ResultSig a -> b #

foldr' :: (a -> b -> b) -> b -> ResultSig a -> b #

foldl :: (b -> a -> b) -> b -> ResultSig a -> b #

foldl' :: (b -> a -> b) -> b -> ResultSig a -> b #

foldr1 :: (a -> a -> a) -> ResultSig a -> a #

foldl1 :: (a -> a -> a) -> ResultSig a -> a #

toList :: ResultSig a -> [a] #

null :: ResultSig a -> Bool #

length :: ResultSig a -> Int #

elem :: Eq a => a -> ResultSig a -> Bool #

maximum :: Ord a => ResultSig a -> a #

minimum :: Ord a => ResultSig a -> a #

sum :: Num a => ResultSig a -> a #

product :: Num a => ResultSig a -> a #

Foldable DeclHead 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => DeclHead m -> m #

foldMap :: Monoid m => (a -> m) -> DeclHead a -> m #

foldMap' :: Monoid m => (a -> m) -> DeclHead a -> m #

foldr :: (a -> b -> b) -> b -> DeclHead a -> b #

foldr' :: (a -> b -> b) -> b -> DeclHead a -> b #

foldl :: (b -> a -> b) -> b -> DeclHead a -> b #

foldl' :: (b -> a -> b) -> b -> DeclHead a -> b #

foldr1 :: (a -> a -> a) -> DeclHead a -> a #

foldl1 :: (a -> a -> a) -> DeclHead a -> a #

toList :: DeclHead a -> [a] #

null :: DeclHead a -> Bool #

length :: DeclHead a -> Int #

elem :: Eq a => a -> DeclHead a -> Bool #

maximum :: Ord a => DeclHead a -> a #

minimum :: Ord a => DeclHead a -> a #

sum :: Num a => DeclHead a -> a #

product :: Num a => DeclHead a -> a #

Foldable InstRule 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => InstRule m -> m #

foldMap :: Monoid m => (a -> m) -> InstRule a -> m #

foldMap' :: Monoid m => (a -> m) -> InstRule a -> m #

foldr :: (a -> b -> b) -> b -> InstRule a -> b #

foldr' :: (a -> b -> b) -> b -> InstRule a -> b #

foldl :: (b -> a -> b) -> b -> InstRule a -> b #

foldl' :: (b -> a -> b) -> b -> InstRule a -> b #

foldr1 :: (a -> a -> a) -> InstRule a -> a #

foldl1 :: (a -> a -> a) -> InstRule a -> a #

toList :: InstRule a -> [a] #

null :: InstRule a -> Bool #

length :: InstRule a -> Int #

elem :: Eq a => a -> InstRule a -> Bool #

maximum :: Ord a => InstRule a -> a #

minimum :: Ord a => InstRule a -> a #

sum :: Num a => InstRule a -> a #

product :: Num a => InstRule a -> a #

Foldable InstHead 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => InstHead m -> m #

foldMap :: Monoid m => (a -> m) -> InstHead a -> m #

foldMap' :: Monoid m => (a -> m) -> InstHead a -> m #

foldr :: (a -> b -> b) -> b -> InstHead a -> b #

foldr' :: (a -> b -> b) -> b -> InstHead a -> b #

foldl :: (b -> a -> b) -> b -> InstHead a -> b #

foldl' :: (b -> a -> b) -> b -> InstHead a -> b #

foldr1 :: (a -> a -> a) -> InstHead a -> a #

foldl1 :: (a -> a -> a) -> InstHead a -> a #

toList :: InstHead a -> [a] #

null :: InstHead a -> Bool #

length :: InstHead a -> Int #

elem :: Eq a => a -> InstHead a -> Bool #

maximum :: Ord a => InstHead a -> a #

minimum :: Ord a => InstHead a -> a #

sum :: Num a => InstHead a -> a #

product :: Num a => InstHead a -> a #

Foldable Deriving 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => Deriving m -> m #

foldMap :: Monoid m => (a -> m) -> Deriving a -> m #

foldMap' :: Monoid m => (a -> m) -> Deriving a -> m #

foldr :: (a -> b -> b) -> b -> Deriving a -> b #

foldr' :: (a -> b -> b) -> b -> Deriving a -> b #

foldl :: (b -> a -> b) -> b -> Deriving a -> b #

foldl' :: (b -> a -> b) -> b -> Deriving a -> b #

foldr1 :: (a -> a -> a) -> Deriving a -> a #

foldl1 :: (a -> a -> a) -> Deriving a -> a #

toList :: Deriving a -> [a] #

null :: Deriving a -> Bool #

length :: Deriving a -> Int #

elem :: Eq a => a -> Deriving a -> Bool #

maximum :: Ord a => Deriving a -> a #

minimum :: Ord a => Deriving a -> a #

sum :: Num a => Deriving a -> a #

product :: Num a => Deriving a -> a #

Foldable DerivStrategy 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => DerivStrategy m -> m #

foldMap :: Monoid m => (a -> m) -> DerivStrategy a -> m #

foldMap' :: Monoid m => (a -> m) -> DerivStrategy a -> m #

foldr :: (a -> b -> b) -> b -> DerivStrategy a -> b #

foldr' :: (a -> b -> b) -> b -> DerivStrategy a -> b #

foldl :: (b -> a -> b) -> b -> DerivStrategy a -> b #

foldl' :: (b -> a -> b) -> b -> DerivStrategy a -> b #

foldr1 :: (a -> a -> a) -> DerivStrategy a -> a #

foldl1 :: (a -> a -> a) -> DerivStrategy a -> a #

toList :: DerivStrategy a -> [a] #

null :: DerivStrategy a -> Bool #

length :: DerivStrategy a -> Int #

elem :: Eq a => a -> DerivStrategy a -> Bool #

maximum :: Ord a => DerivStrategy a -> a #

minimum :: Ord a => DerivStrategy a -> a #

sum :: Num a => DerivStrategy a -> a #

product :: Num a => DerivStrategy a -> a #

Foldable Binds 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => Binds m -> m #

foldMap :: Monoid m => (a -> m) -> Binds a -> m #

foldMap' :: Monoid m => (a -> m) -> Binds a -> m #

foldr :: (a -> b -> b) -> b -> Binds a -> b #

foldr' :: (a -> b -> b) -> b -> Binds a -> b #

foldl :: (b -> a -> b) -> b -> Binds a -> b #

foldl' :: (b -> a -> b) -> b -> Binds a -> b #

foldr1 :: (a -> a -> a) -> Binds a -> a #

foldl1 :: (a -> a -> a) -> Binds a -> a #

toList :: Binds a -> [a] #

null :: Binds a -> Bool #

length :: Binds a -> Int #

elem :: Eq a => a -> Binds a -> Bool #

maximum :: Ord a => Binds a -> a #

minimum :: Ord a => Binds a -> a #

sum :: Num a => Binds a -> a #

product :: Num a => Binds a -> a #

Foldable IPBind 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => IPBind m -> m #

foldMap :: Monoid m => (a -> m) -> IPBind a -> m #

foldMap' :: Monoid m => (a -> m) -> IPBind a -> m #

foldr :: (a -> b -> b) -> b -> IPBind a -> b #

foldr' :: (a -> b -> b) -> b -> IPBind a -> b #

foldl :: (b -> a -> b) -> b -> IPBind a -> b #

foldl' :: (b -> a -> b) -> b -> IPBind a -> b #

foldr1 :: (a -> a -> a) -> IPBind a -> a #

foldl1 :: (a -> a -> a) -> IPBind a -> a #

toList :: IPBind a -> [a] #

null :: IPBind a -> Bool #

length :: IPBind a -> Int #

elem :: Eq a => a -> IPBind a -> Bool #

maximum :: Ord a => IPBind a -> a #

minimum :: Ord a => IPBind a -> a #

sum :: Num a => IPBind a -> a #

product :: Num a => IPBind a -> a #

Foldable Match 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => Match m -> m #

foldMap :: Monoid m => (a -> m) -> Match a -> m #

foldMap' :: Monoid m => (a -> m) -> Match a -> m #

foldr :: (a -> b -> b) -> b -> Match a -> b #

foldr' :: (a -> b -> b) -> b -> Match a -> b #

foldl :: (b -> a -> b) -> b -> Match a -> b #

foldl' :: (b -> a -> b) -> b -> Match a -> b #

foldr1 :: (a -> a -> a) -> Match a -> a #

foldl1 :: (a -> a -> a) -> Match a -> a #

toList :: Match a -> [a] #

null :: Match a -> Bool #

length :: Match a -> Int #

elem :: Eq a => a -> Match a -> Bool #

maximum :: Ord a => Match a -> a #

minimum :: Ord a => Match a -> a #

sum :: Num a => Match a -> a #

product :: Num a => Match a -> a #

Foldable QualConDecl 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => QualConDecl m -> m #

foldMap :: Monoid m => (a -> m) -> QualConDecl a -> m #

foldMap' :: Monoid m => (a -> m) -> QualConDecl a -> m #

foldr :: (a -> b -> b) -> b -> QualConDecl a -> b #

foldr' :: (a -> b -> b) -> b -> QualConDecl a -> b #

foldl :: (b -> a -> b) -> b -> QualConDecl a -> b #

foldl' :: (b -> a -> b) -> b -> QualConDecl a -> b #

foldr1 :: (a -> a -> a) -> QualConDecl a -> a #

foldl1 :: (a -> a -> a) -> QualConDecl a -> a #

toList :: QualConDecl a -> [a] #

null :: QualConDecl a -> Bool #

length :: QualConDecl a -> Int #

elem :: Eq a => a -> QualConDecl a -> Bool #

maximum :: Ord a => QualConDecl a -> a #

minimum :: Ord a => QualConDecl a -> a #

sum :: Num a => QualConDecl a -> a #

product :: Num a => QualConDecl a -> a #

Foldable ConDecl 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => ConDecl m -> m #

foldMap :: Monoid m => (a -> m) -> ConDecl a -> m #

foldMap' :: Monoid m => (a -> m) -> ConDecl a -> m #

foldr :: (a -> b -> b) -> b -> ConDecl a -> b #

foldr' :: (a -> b -> b) -> b -> ConDecl a -> b #

foldl :: (b -> a -> b) -> b -> ConDecl a -> b #

foldl' :: (b -> a -> b) -> b -> ConDecl a -> b #

foldr1 :: (a -> a -> a) -> ConDecl a -> a #

foldl1 :: (a -> a -> a) -> ConDecl a -> a #

toList :: ConDecl a -> [a] #

null :: ConDecl a -> Bool #

length :: ConDecl a -> Int #

elem :: Eq a => a -> ConDecl a -> Bool #

maximum :: Ord a => ConDecl a -> a #

minimum :: Ord a => ConDecl a -> a #

sum :: Num a => ConDecl a -> a #

product :: Num a => ConDecl a -> a #

Foldable FieldDecl 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => FieldDecl m -> m #

foldMap :: Monoid m => (a -> m) -> FieldDecl a -> m #

foldMap' :: Monoid m => (a -> m) -> FieldDecl a -> m #

foldr :: (a -> b -> b) -> b -> FieldDecl a -> b #

foldr' :: (a -> b -> b) -> b -> FieldDecl a -> b #

foldl :: (b -> a -> b) -> b -> FieldDecl a -> b #

foldl' :: (b -> a -> b) -> b -> FieldDecl a -> b #

foldr1 :: (a -> a -> a) -> FieldDecl a -> a #

foldl1 :: (a -> a -> a) -> FieldDecl a -> a #

toList :: FieldDecl a -> [a] #

null :: FieldDecl a -> Bool #

length :: FieldDecl a -> Int #

elem :: Eq a => a -> FieldDecl a -> Bool #

maximum :: Ord a => FieldDecl a -> a #

minimum :: Ord a => FieldDecl a -> a #

sum :: Num a => FieldDecl a -> a #

product :: Num a => FieldDecl a -> a #

Foldable GadtDecl 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => GadtDecl m -> m #

foldMap :: Monoid m => (a -> m) -> GadtDecl a -> m #

foldMap' :: Monoid m => (a -> m) -> GadtDecl a -> m #

foldr :: (a -> b -> b) -> b -> GadtDecl a -> b #

foldr' :: (a -> b -> b) -> b -> GadtDecl a -> b #

foldl :: (b -> a -> b) -> b -> GadtDecl a -> b #

foldl' :: (b -> a -> b) -> b -> GadtDecl a -> b #

foldr1 :: (a -> a -> a) -> GadtDecl a -> a #

foldl1 :: (a -> a -> a) -> GadtDecl a -> a #

toList :: GadtDecl a -> [a] #

null :: GadtDecl a -> Bool #

length :: GadtDecl a -> Int #

elem :: Eq a => a -> GadtDecl a -> Bool #

maximum :: Ord a => GadtDecl a -> a #

minimum :: Ord a => GadtDecl a -> a #

sum :: Num a => GadtDecl a -> a #

product :: Num a => GadtDecl a -> a #

Foldable ClassDecl 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => ClassDecl m -> m #

foldMap :: Monoid m => (a -> m) -> ClassDecl a -> m #

foldMap' :: Monoid m => (a -> m) -> ClassDecl a -> m #

foldr :: (a -> b -> b) -> b -> ClassDecl a -> b #

foldr' :: (a -> b -> b) -> b -> ClassDecl a -> b #

foldl :: (b -> a -> b) -> b -> ClassDecl a -> b #

foldl' :: (b -> a -> b) -> b -> ClassDecl a -> b #

foldr1 :: (a -> a -> a) -> ClassDecl a -> a #

foldl1 :: (a -> a -> a) -> ClassDecl a -> a #

toList :: ClassDecl a -> [a] #

null :: ClassDecl a -> Bool #

length :: ClassDecl a -> Int #

elem :: Eq a => a -> ClassDecl a -> Bool #

maximum :: Ord a => ClassDecl a -> a #

minimum :: Ord a => ClassDecl a -> a #

sum :: Num a => ClassDecl a -> a #

product :: Num a => ClassDecl a -> a #

Foldable InstDecl 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => InstDecl m -> m #

foldMap :: Monoid m => (a -> m) -> InstDecl a -> m #

foldMap' :: Monoid m => (a -> m) -> InstDecl a -> m #

foldr :: (a -> b -> b) -> b -> InstDecl a -> b #

foldr' :: (a -> b -> b) -> b -> InstDecl a -> b #

foldl :: (b -> a -> b) -> b -> InstDecl a -> b #

foldl' :: (b -> a -> b) -> b -> InstDecl a -> b #

foldr1 :: (a -> a -> a) -> InstDecl a -> a #

foldl1 :: (a -> a -> a) -> InstDecl a -> a #

toList :: InstDecl a -> [a] #

null :: InstDecl a -> Bool #

length :: InstDecl a -> Int #

elem :: Eq a => a -> InstDecl a -> Bool #

maximum :: Ord a => InstDecl a -> a #

minimum :: Ord a => InstDecl a -> a #

sum :: Num a => InstDecl a -> a #

product :: Num a => InstDecl a -> a #

Foldable BangType 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => BangType m -> m #

foldMap :: Monoid m => (a -> m) -> BangType a -> m #

foldMap' :: Monoid m => (a -> m) -> BangType a -> m #

foldr :: (a -> b -> b) -> b -> BangType a -> b #

foldr' :: (a -> b -> b) -> b -> BangType a -> b #

foldl :: (b -> a -> b) -> b -> BangType a -> b #

foldl' :: (b -> a -> b) -> b -> BangType a -> b #

foldr1 :: (a -> a -> a) -> BangType a -> a #

foldl1 :: (a -> a -> a) -> BangType a -> a #

toList :: BangType a -> [a] #

null :: BangType a -> Bool #

length :: BangType a -> Int #

elem :: Eq a => a -> BangType a -> Bool #

maximum :: Ord a => BangType a -> a #

minimum :: Ord a => BangType a -> a #

sum :: Num a => BangType a -> a #

product :: Num a => BangType a -> a #

Foldable Unpackedness 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => Unpackedness m -> m #

foldMap :: Monoid m => (a -> m) -> Unpackedness a -> m #

foldMap' :: Monoid m => (a -> m) -> Unpackedness a -> m #

foldr :: (a -> b -> b) -> b -> Unpackedness a -> b #

foldr' :: (a -> b -> b) -> b -> Unpackedness a -> b #

foldl :: (b -> a -> b) -> b -> Unpackedness a -> b #

foldl' :: (b -> a -> b) -> b -> Unpackedness a -> b #

foldr1 :: (a -> a -> a) -> Unpackedness a -> a #

foldl1 :: (a -> a -> a) -> Unpackedness a -> a #

toList :: Unpackedness a -> [a] #

null :: Unpackedness a -> Bool #

length :: Unpackedness a -> Int #

elem :: Eq a => a -> Unpackedness a -> Bool #

maximum :: Ord a => Unpackedness a -> a #

minimum :: Ord a => Unpackedness a -> a #

sum :: Num a => Unpackedness a -> a #

product :: Num a => Unpackedness a -> a #

Foldable Rhs 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => Rhs m -> m #

foldMap :: Monoid m => (a -> m) -> Rhs a -> m #

foldMap' :: Monoid m => (a -> m) -> Rhs a -> m #

foldr :: (a -> b -> b) -> b -> Rhs a -> b #

foldr' :: (a -> b -> b) -> b -> Rhs a -> b #

foldl :: (b -> a -> b) -> b -> Rhs a -> b #

foldl' :: (b -> a -> b) -> b -> Rhs a -> b #

foldr1 :: (a -> a -> a) -> Rhs a -> a #

foldl1 :: (a -> a -> a) -> Rhs a -> a #

toList :: Rhs a -> [a] #

null :: Rhs a -> Bool #

length :: Rhs a -> Int #

elem :: Eq a => a -> Rhs a -> Bool #

maximum :: Ord a => Rhs a -> a #

minimum :: Ord a => Rhs a -> a #

sum :: Num a => Rhs a -> a #

product :: Num a => Rhs a -> a #

Foldable GuardedRhs 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => GuardedRhs m -> m #

foldMap :: Monoid m => (a -> m) -> GuardedRhs a -> m #

foldMap' :: Monoid m => (a -> m) -> GuardedRhs a -> m #

foldr :: (a -> b -> b) -> b -> GuardedRhs a -> b #

foldr' :: (a -> b -> b) -> b -> GuardedRhs a -> b #

foldl :: (b -> a -> b) -> b -> GuardedRhs a -> b #

foldl' :: (b -> a -> b) -> b -> GuardedRhs a -> b #

foldr1 :: (a -> a -> a) -> GuardedRhs a -> a #

foldl1 :: (a -> a -> a) -> GuardedRhs a -> a #

toList :: GuardedRhs a -> [a] #

null :: GuardedRhs a -> Bool #

length :: GuardedRhs a -> Int #

elem :: Eq a => a -> GuardedRhs a -> Bool #

maximum :: Ord a => GuardedRhs a -> a #

minimum :: Ord a => GuardedRhs a -> a #

sum :: Num a => GuardedRhs a -> a #

product :: Num a => GuardedRhs a -> a #

Foldable Type 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => Type m -> m #

foldMap :: Monoid m => (a -> m) -> Type a -> m #

foldMap' :: Monoid m => (a -> m) -> Type a -> m #

foldr :: (a -> b -> b) -> b -> Type a -> b #

foldr' :: (a -> b -> b) -> b -> Type a -> b #

foldl :: (b -> a -> b) -> b -> Type a -> b #

foldl' :: (b -> a -> b) -> b -> Type a -> b #

foldr1 :: (a -> a -> a) -> Type a -> a #

foldl1 :: (a -> a -> a) -> Type a -> a #

toList :: Type a -> [a] #

null :: Type a -> Bool #

length :: Type a -> Int #

elem :: Eq a => a -> Type a -> Bool #

maximum :: Ord a => Type a -> a #

minimum :: Ord a => Type a -> a #

sum :: Num a => Type a -> a #

product :: Num a => Type a -> a #

Foldable MaybePromotedName 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => MaybePromotedName m -> m #

foldMap :: Monoid m => (a -> m) -> MaybePromotedName a -> m #

foldMap' :: Monoid m => (a -> m) -> MaybePromotedName a -> m #

foldr :: (a -> b -> b) -> b -> MaybePromotedName a -> b #

foldr' :: (a -> b -> b) -> b -> MaybePromotedName a -> b #

foldl :: (b -> a -> b) -> b -> MaybePromotedName a -> b #

foldl' :: (b -> a -> b) -> b -> MaybePromotedName a -> b #

foldr1 :: (a -> a -> a) -> MaybePromotedName a -> a #

foldl1 :: (a -> a -> a) -> MaybePromotedName a -> a #

toList :: MaybePromotedName a -> [a] #

null :: MaybePromotedName a -> Bool #

length :: MaybePromotedName a -> Int #

elem :: Eq a => a -> MaybePromotedName a -> Bool #

maximum :: Ord a => MaybePromotedName a -> a #

minimum :: Ord a => MaybePromotedName a -> a #

sum :: Num a => MaybePromotedName a -> a #

product :: Num a => MaybePromotedName a -> a #

Foldable Promoted 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => Promoted m -> m #

foldMap :: Monoid m => (a -> m) -> Promoted a -> m #

foldMap' :: Monoid m => (a -> m) -> Promoted a -> m #

foldr :: (a -> b -> b) -> b -> Promoted a -> b #

foldr' :: (a -> b -> b) -> b -> Promoted a -> b #

foldl :: (b -> a -> b) -> b -> Promoted a -> b #

foldl' :: (b -> a -> b) -> b -> Promoted a -> b #

foldr1 :: (a -> a -> a) -> Promoted a -> a #

foldl1 :: (a -> a -> a) -> Promoted a -> a #

toList :: Promoted a -> [a] #

null :: Promoted a -> Bool #

length :: Promoted a -> Int #

elem :: Eq a => a -> Promoted a -> Bool #

maximum :: Ord a => Promoted a -> a #

minimum :: Ord a => Promoted a -> a #

sum :: Num a => Promoted a -> a #

product :: Num a => Promoted a -> a #

Foldable TyVarBind 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => TyVarBind m -> m #

foldMap :: Monoid m => (a -> m) -> TyVarBind a -> m #

foldMap' :: Monoid m => (a -> m) -> TyVarBind a -> m #

foldr :: (a -> b -> b) -> b -> TyVarBind a -> b #

foldr' :: (a -> b -> b) -> b -> TyVarBind a -> b #

foldl :: (b -> a -> b) -> b -> TyVarBind a -> b #

foldl' :: (b -> a -> b) -> b -> TyVarBind a -> b #

foldr1 :: (a -> a -> a) -> TyVarBind a -> a #

foldl1 :: (a -> a -> a) -> TyVarBind a -> a #

toList :: TyVarBind a -> [a] #

null :: TyVarBind a -> Bool #

length :: TyVarBind a -> Int #

elem :: Eq a => a -> TyVarBind a -> Bool #

maximum :: Ord a => TyVarBind a -> a #

minimum :: Ord a => TyVarBind a -> a #

sum :: Num a => TyVarBind a -> a #

product :: Num a => TyVarBind a -> a #

Foldable FunDep 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => FunDep m -> m #

foldMap :: Monoid m => (a -> m) -> FunDep a -> m #

foldMap' :: Monoid m => (a -> m) -> FunDep a -> m #

foldr :: (a -> b -> b) -> b -> FunDep a -> b #

foldr' :: (a -> b -> b) -> b -> FunDep a -> b #

foldl :: (b -> a -> b) -> b -> FunDep a -> b #

foldl' :: (b -> a -> b) -> b -> FunDep a -> b #

foldr1 :: (a -> a -> a) -> FunDep a -> a #

foldl1 :: (a -> a -> a) -> FunDep a -> a #

toList :: FunDep a -> [a] #

null :: FunDep a -> Bool #

length :: FunDep a -> Int #

elem :: Eq a => a -> FunDep a -> Bool #

maximum :: Ord a => FunDep a -> a #

minimum :: Ord a => FunDep a -> a #

sum :: Num a => FunDep a -> a #

product :: Num a => FunDep a -> a #

Foldable Context 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => Context m -> m #

foldMap :: Monoid m => (a -> m) -> Context a -> m #

foldMap' :: Monoid m => (a -> m) -> Context a -> m #

foldr :: (a -> b -> b) -> b -> Context a -> b #

foldr' :: (a -> b -> b) -> b -> Context a -> b #

foldl :: (b -> a -> b) -> b -> Context a -> b #

foldl' :: (b -> a -> b) -> b -> Context a -> b #

foldr1 :: (a -> a -> a) -> Context a -> a #

foldl1 :: (a -> a -> a) -> Context a -> a #

toList :: Context a -> [a] #

null :: Context a -> Bool #

length :: Context a -> Int #

elem :: Eq a => a -> Context a -> Bool #

maximum :: Ord a => Context a -> a #

minimum :: Ord a => Context a -> a #

sum :: Num a => Context a -> a #

product :: Num a => Context a -> a #

Foldable Asst 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => Asst m -> m #

foldMap :: Monoid m => (a -> m) -> Asst a -> m #

foldMap' :: Monoid m => (a -> m) -> Asst a -> m #

foldr :: (a -> b -> b) -> b -> Asst a -> b #

foldr' :: (a -> b -> b) -> b -> Asst a -> b #

foldl :: (b -> a -> b) -> b -> Asst a -> b #

foldl' :: (b -> a -> b) -> b -> Asst a -> b #

foldr1 :: (a -> a -> a) -> Asst a -> a #

foldl1 :: (a -> a -> a) -> Asst a -> a #

toList :: Asst a -> [a] #

null :: Asst a -> Bool #

length :: Asst a -> Int #

elem :: Eq a => a -> Asst a -> Bool #

maximum :: Ord a => Asst a -> a #

minimum :: Ord a => Asst a -> a #

sum :: Num a => Asst a -> a #

product :: Num a => Asst a -> a #

Foldable Literal 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => Literal m -> m #

foldMap :: Monoid m => (a -> m) -> Literal a -> m #

foldMap' :: Monoid m => (a -> m) -> Literal a -> m #

foldr :: (a -> b -> b) -> b -> Literal a -> b #

foldr' :: (a -> b -> b) -> b -> Literal a -> b #

foldl :: (b -> a -> b) -> b -> Literal a -> b #

foldl' :: (b -> a -> b) -> b -> Literal a -> b #

foldr1 :: (a -> a -> a) -> Literal a -> a #

foldl1 :: (a -> a -> a) -> Literal a -> a #

toList :: Literal a -> [a] #

null :: Literal a -> Bool #

length :: Literal a -> Int #

elem :: Eq a => a -> Literal a -> Bool #

maximum :: Ord a => Literal a -> a #

minimum :: Ord a => Literal a -> a #

sum :: Num a => Literal a -> a #

product :: Num a => Literal a -> a #

Foldable Sign 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => Sign m -> m #

foldMap :: Monoid m => (a -> m) -> Sign a -> m #

foldMap' :: Monoid m => (a -> m) -> Sign a -> m #

foldr :: (a -> b -> b) -> b -> Sign a -> b #

foldr' :: (a -> b -> b) -> b -> Sign a -> b #

foldl :: (b -> a -> b) -> b -> Sign a -> b #

foldl' :: (b -> a -> b) -> b -> Sign a -> b #

foldr1 :: (a -> a -> a) -> Sign a -> a #

foldl1 :: (a -> a -> a) -> Sign a -> a #

toList :: Sign a -> [a] #

null :: Sign a -> Bool #

length :: Sign a -> Int #

elem :: Eq a => a -> Sign a -> Bool #

maximum :: Ord a => Sign a -> a #

minimum :: Ord a => Sign a -> a #

sum :: Num a => Sign a -> a #

product :: Num a => Sign a -> a #

Foldable Exp 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => Exp m -> m #

foldMap :: Monoid m => (a -> m) -> Exp a -> m #

foldMap' :: Monoid m => (a -> m) -> Exp a -> m #

foldr :: (a -> b -> b) -> b -> Exp a -> b #

foldr' :: (a -> b -> b) -> b -> Exp a -> b #

foldl :: (b -> a -> b) -> b -> Exp a -> b #

foldl' :: (b -> a -> b) -> b -> Exp a -> b #

foldr1 :: (a -> a -> a) -> Exp a -> a #

foldl1 :: (a -> a -> a) -> Exp a -> a #

toList :: Exp a -> [a] #

null :: Exp a -> Bool #

length :: Exp a -> Int #

elem :: Eq a => a -> Exp a -> Bool #

maximum :: Ord a => Exp a -> a #

minimum :: Ord a => Exp a -> a #

sum :: Num a => Exp a -> a #

product :: Num a => Exp a -> a #

Foldable XName 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => XName m -> m #

foldMap :: Monoid m => (a -> m) -> XName a -> m #

foldMap' :: Monoid m => (a -> m) -> XName a -> m #

foldr :: (a -> b -> b) -> b -> XName a -> b #

foldr' :: (a -> b -> b) -> b -> XName a -> b #

foldl :: (b -> a -> b) -> b -> XName a -> b #

foldl' :: (b -> a -> b) -> b -> XName a -> b #

foldr1 :: (a -> a -> a) -> XName a -> a #

foldl1 :: (a -> a -> a) -> XName a -> a #

toList :: XName a -> [a] #

null :: XName a -> Bool #

length :: XName a -> Int #

elem :: Eq a => a -> XName a -> Bool #

maximum :: Ord a => XName a -> a #

minimum :: Ord a => XName a -> a #

sum :: Num a => XName a -> a #

product :: Num a => XName a -> a #

Foldable XAttr 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => XAttr m -> m #

foldMap :: Monoid m => (a -> m) -> XAttr a -> m #

foldMap' :: Monoid m => (a -> m) -> XAttr a -> m #

foldr :: (a -> b -> b) -> b -> XAttr a -> b #

foldr' :: (a -> b -> b) -> b -> XAttr a -> b #

foldl :: (b -> a -> b) -> b -> XAttr a -> b #

foldl' :: (b -> a -> b) -> b -> XAttr a -> b #

foldr1 :: (a -> a -> a) -> XAttr a -> a #

foldl1 :: (a -> a -> a) -> XAttr a -> a #

toList :: XAttr a -> [a] #

null :: XAttr a -> Bool #

length :: XAttr a -> Int #

elem :: Eq a => a -> XAttr a -> Bool #

maximum :: Ord a => XAttr a -> a #

minimum :: Ord a => XAttr a -> a #

sum :: Num a => XAttr a -> a #

product :: Num a => XAttr a -> a #

Foldable Bracket 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => Bracket m -> m #

foldMap :: Monoid m => (a -> m) -> Bracket a -> m #

foldMap' :: Monoid m => (a -> m) -> Bracket a -> m #

foldr :: (a -> b -> b) -> b -> Bracket a -> b #

foldr' :: (a -> b -> b) -> b -> Bracket a -> b #

foldl :: (b -> a -> b) -> b -> Bracket a -> b #

foldl' :: (b -> a -> b) -> b -> Bracket a -> b #

foldr1 :: (a -> a -> a) -> Bracket a -> a #

foldl1 :: (a -> a -> a) -> Bracket a -> a #

toList :: Bracket a -> [a] #

null :: Bracket a -> Bool #

length :: Bracket a -> Int #

elem :: Eq a => a -> Bracket a -> Bool #

maximum :: Ord a => Bracket a -> a #

minimum :: Ord a => Bracket a -> a #

sum :: Num a => Bracket a -> a #

product :: Num a => Bracket a -> a #

Foldable Splice 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => Splice m -> m #

foldMap :: Monoid m => (a -> m) -> Splice a -> m #

foldMap' :: Monoid m => (a -> m) -> Splice a -> m #

foldr :: (a -> b -> b) -> b -> Splice a -> b #

foldr' :: (a -> b -> b) -> b -> Splice a -> b #

foldl :: (b -> a -> b) -> b -> Splice a -> b #

foldl' :: (b -> a -> b) -> b -> Splice a -> b #

foldr1 :: (a -> a -> a) -> Splice a -> a #

foldl1 :: (a -> a -> a) -> Splice a -> a #

toList :: Splice a -> [a] #

null :: Splice a -> Bool #

length :: Splice a -> Int #

elem :: Eq a => a -> Splice a -> Bool #

maximum :: Ord a => Splice a -> a #

minimum :: Ord a => Splice a -> a #

sum :: Num a => Splice a -> a #

product :: Num a => Splice a -> a #

Foldable Safety 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => Safety m -> m #

foldMap :: Monoid m => (a -> m) -> Safety a -> m #

foldMap' :: Monoid m => (a -> m) -> Safety a -> m #

foldr :: (a -> b -> b) -> b -> Safety a -> b #

foldr' :: (a -> b -> b) -> b -> Safety a -> b #

foldl :: (b -> a -> b) -> b -> Safety a -> b #

foldl' :: (b -> a -> b) -> b -> Safety a -> b #

foldr1 :: (a -> a -> a) -> Safety a -> a #

foldl1 :: (a -> a -> a) -> Safety a -> a #

toList :: Safety a -> [a] #

null :: Safety a -> Bool #

length :: Safety a -> Int #

elem :: Eq a => a -> Safety a -> Bool #

maximum :: Ord a => Safety a -> a #

minimum :: Ord a => Safety a -> a #

sum :: Num a => Safety a -> a #

product :: Num a => Safety a -> a #

Foldable CallConv 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => CallConv m -> m #

foldMap :: Monoid m => (a -> m) -> CallConv a -> m #

foldMap' :: Monoid m => (a -> m) -> CallConv a -> m #

foldr :: (a -> b -> b) -> b -> CallConv a -> b #

foldr' :: (a -> b -> b) -> b -> CallConv a -> b #

foldl :: (b -> a -> b) -> b -> CallConv a -> b #

foldl' :: (b -> a -> b) -> b -> CallConv a -> b #

foldr1 :: (a -> a -> a) -> CallConv a -> a #

foldl1 :: (a -> a -> a) -> CallConv a -> a #

toList :: CallConv a -> [a] #

null :: CallConv a -> Bool #

length :: CallConv a -> Int #

elem :: Eq a => a -> CallConv a -> Bool #

maximum :: Ord a => CallConv a -> a #

minimum :: Ord a => CallConv a -> a #

sum :: Num a => CallConv a -> a #

product :: Num a => CallConv a -> a #

Foldable ModulePragma 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => ModulePragma m -> m #

foldMap :: Monoid m => (a -> m) -> ModulePragma a -> m #

foldMap' :: Monoid m => (a -> m) -> ModulePragma a -> m #

foldr :: (a -> b -> b) -> b -> ModulePragma a -> b #

foldr' :: (a -> b -> b) -> b -> ModulePragma a -> b #

foldl :: (b -> a -> b) -> b -> ModulePragma a -> b #

foldl' :: (b -> a -> b) -> b -> ModulePragma a -> b #

foldr1 :: (a -> a -> a) -> ModulePragma a -> a #

foldl1 :: (a -> a -> a) -> ModulePragma a -> a #

toList :: ModulePragma a -> [a] #

null :: ModulePragma a -> Bool #

length :: ModulePragma a -> Int #

elem :: Eq a => a -> ModulePragma a -> Bool #

maximum :: Ord a => ModulePragma a -> a #

minimum :: Ord a => ModulePragma a -> a #

sum :: Num a => ModulePragma a -> a #

product :: Num a => ModulePragma a -> a #

Foldable Overlap 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => Overlap m -> m #

foldMap :: Monoid m => (a -> m) -> Overlap a -> m #

foldMap' :: Monoid m => (a -> m) -> Overlap a -> m #

foldr :: (a -> b -> b) -> b -> Overlap a -> b #

foldr' :: (a -> b -> b) -> b -> Overlap a -> b #

foldl :: (b -> a -> b) -> b -> Overlap a -> b #

foldl' :: (b -> a -> b) -> b -> Overlap a -> b #

foldr1 :: (a -> a -> a) -> Overlap a -> a #

foldl1 :: (a -> a -> a) -> Overlap a -> a #

toList :: Overlap a -> [a] #

null :: Overlap a -> Bool #

length :: Overlap a -> Int #

elem :: Eq a => a -> Overlap a -> Bool #

maximum :: Ord a => Overlap a -> a #

minimum :: Ord a => Overlap a -> a #

sum :: Num a => Overlap a -> a #

product :: Num a => Overlap a -> a #

Foldable Activation 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => Activation m -> m #

foldMap :: Monoid m => (a -> m) -> Activation a -> m #

foldMap' :: Monoid m => (a -> m) -> Activation a -> m #

foldr :: (a -> b -> b) -> b -> Activation a -> b #

foldr' :: (a -> b -> b) -> b -> Activation a -> b #

foldl :: (b -> a -> b) -> b -> Activation a -> b #

foldl' :: (b -> a -> b) -> b -> Activation a -> b #

foldr1 :: (a -> a -> a) -> Activation a -> a #

foldl1 :: (a -> a -> a) -> Activation a -> a #

toList :: Activation a -> [a] #

null :: Activation a -> Bool #

length :: Activation a -> Int #

elem :: Eq a => a -> Activation a -> Bool #

maximum :: Ord a => Activation a -> a #

minimum :: Ord a => Activation a -> a #

sum :: Num a => Activation a -> a #

product :: Num a => Activation a -> a #

Foldable Rule 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => Rule m -> m #

foldMap :: Monoid m => (a -> m) -> Rule a -> m #

foldMap' :: Monoid m => (a -> m) -> Rule a -> m #

foldr :: (a -> b -> b) -> b -> Rule a -> b #

foldr' :: (a -> b -> b) -> b -> Rule a -> b #

foldl :: (b -> a -> b) -> b -> Rule a -> b #

foldl' :: (b -> a -> b) -> b -> Rule a -> b #

foldr1 :: (a -> a -> a) -> Rule a -> a #

foldl1 :: (a -> a -> a) -> Rule a -> a #

toList :: Rule a -> [a] #

null :: Rule a -> Bool #

length :: Rule a -> Int #

elem :: Eq a => a -> Rule a -> Bool #

maximum :: Ord a => Rule a -> a #

minimum :: Ord a => Rule a -> a #

sum :: Num a => Rule a -> a #

product :: Num a => Rule a -> a #

Foldable RuleVar 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => RuleVar m -> m #

foldMap :: Monoid m => (a -> m) -> RuleVar a -> m #

foldMap' :: Monoid m => (a -> m) -> RuleVar a -> m #

foldr :: (a -> b -> b) -> b -> RuleVar a -> b #

foldr' :: (a -> b -> b) -> b -> RuleVar a -> b #

foldl :: (b -> a -> b) -> b -> RuleVar a -> b #

foldl' :: (b -> a -> b) -> b -> RuleVar a -> b #

foldr1 :: (a -> a -> a) -> RuleVar a -> a #

foldl1 :: (a -> a -> a) -> RuleVar a -> a #

toList :: RuleVar a -> [a] #

null :: RuleVar a -> Bool #

length :: RuleVar a -> Int #

elem :: Eq a => a -> RuleVar a -> Bool #

maximum :: Ord a => RuleVar a -> a #

minimum :: Ord a => RuleVar a -> a #

sum :: Num a => RuleVar a -> a #

product :: Num a => RuleVar a -> a #

Foldable WarningText 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => WarningText m -> m #

foldMap :: Monoid m => (a -> m) -> WarningText a -> m #

foldMap' :: Monoid m => (a -> m) -> WarningText a -> m #

foldr :: (a -> b -> b) -> b -> WarningText a -> b #

foldr' :: (a -> b -> b) -> b -> WarningText a -> b #

foldl :: (b -> a -> b) -> b -> WarningText a -> b #

foldl' :: (b -> a -> b) -> b -> WarningText a -> b #

foldr1 :: (a -> a -> a) -> WarningText a -> a #

foldl1 :: (a -> a -> a) -> WarningText a -> a #

toList :: WarningText a -> [a] #

null :: WarningText a -> Bool #

length :: WarningText a -> Int #

elem :: Eq a => a -> WarningText a -> Bool #

maximum :: Ord a => WarningText a -> a #

minimum :: Ord a => WarningText a -> a #

sum :: Num a => WarningText a -> a #

product :: Num a => WarningText a -> a #

Foldable Pat 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => Pat m -> m #

foldMap :: Monoid m => (a -> m) -> Pat a -> m #

foldMap' :: Monoid m => (a -> m) -> Pat a -> m #

foldr :: (a -> b -> b) -> b -> Pat a -> b #

foldr' :: (a -> b -> b) -> b -> Pat a -> b #

foldl :: (b -> a -> b) -> b -> Pat a -> b #

foldl' :: (b -> a -> b) -> b -> Pat a -> b #

foldr1 :: (a -> a -> a) -> Pat a -> a #

foldl1 :: (a -> a -> a) -> Pat a -> a #

toList :: Pat a -> [a] #

null :: Pat a -> Bool #

length :: Pat a -> Int #

elem :: Eq a => a -> Pat a -> Bool #

maximum :: Ord a => Pat a -> a #

minimum :: Ord a => Pat a -> a #

sum :: Num a => Pat a -> a #

product :: Num a => Pat a -> a #

Foldable PXAttr 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => PXAttr m -> m #

foldMap :: Monoid m => (a -> m) -> PXAttr a -> m #

foldMap' :: Monoid m => (a -> m) -> PXAttr a -> m #

foldr :: (a -> b -> b) -> b -> PXAttr a -> b #

foldr' :: (a -> b -> b) -> b -> PXAttr a -> b #

foldl :: (b -> a -> b) -> b -> PXAttr a -> b #

foldl' :: (b -> a -> b) -> b -> PXAttr a -> b #

foldr1 :: (a -> a -> a) -> PXAttr a -> a #

foldl1 :: (a -> a -> a) -> PXAttr a -> a #

toList :: PXAttr a -> [a] #

null :: PXAttr a -> Bool #

length :: PXAttr a -> Int #

elem :: Eq a => a -> PXAttr a -> Bool #

maximum :: Ord a => PXAttr a -> a #

minimum :: Ord a => PXAttr a -> a #

sum :: Num a => PXAttr a -> a #

product :: Num a => PXAttr a -> a #

Foldable RPatOp 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => RPatOp m -> m #

foldMap :: Monoid m => (a -> m) -> RPatOp a -> m #

foldMap' :: Monoid m => (a -> m) -> RPatOp a -> m #

foldr :: (a -> b -> b) -> b -> RPatOp a -> b #

foldr' :: (a -> b -> b) -> b -> RPatOp a -> b #

foldl :: (b -> a -> b) -> b -> RPatOp a -> b #

foldl' :: (b -> a -> b) -> b -> RPatOp a -> b #

foldr1 :: (a -> a -> a) -> RPatOp a -> a #

foldl1 :: (a -> a -> a) -> RPatOp a -> a #

toList :: RPatOp a -> [a] #

null :: RPatOp a -> Bool #

length :: RPatOp a -> Int #

elem :: Eq a => a -> RPatOp a -> Bool #

maximum :: Ord a => RPatOp a -> a #

minimum :: Ord a => RPatOp a -> a #

sum :: Num a => RPatOp a -> a #

product :: Num a => RPatOp a -> a #

Foldable RPat 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => RPat m -> m #

foldMap :: Monoid m => (a -> m) -> RPat a -> m #

foldMap' :: Monoid m => (a -> m) -> RPat a -> m #

foldr :: (a -> b -> b) -> b -> RPat a -> b #

foldr' :: (a -> b -> b) -> b -> RPat a -> b #

foldl :: (b -> a -> b) -> b -> RPat a -> b #

foldl' :: (b -> a -> b) -> b -> RPat a -> b #

foldr1 :: (a -> a -> a) -> RPat a -> a #

foldl1 :: (a -> a -> a) -> RPat a -> a #

toList :: RPat a -> [a] #

null :: RPat a -> Bool #

length :: RPat a -> Int #

elem :: Eq a => a -> RPat a -> Bool #

maximum :: Ord a => RPat a -> a #

minimum :: Ord a => RPat a -> a #

sum :: Num a => RPat a -> a #

product :: Num a => RPat a -> a #

Foldable PatField 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => PatField m -> m #

foldMap :: Monoid m => (a -> m) -> PatField a -> m #

foldMap' :: Monoid m => (a -> m) -> PatField a -> m #

foldr :: (a -> b -> b) -> b -> PatField a -> b #

foldr' :: (a -> b -> b) -> b -> PatField a -> b #

foldl :: (b -> a -> b) -> b -> PatField a -> b #

foldl' :: (b -> a -> b) -> b -> PatField a -> b #

foldr1 :: (a -> a -> a) -> PatField a -> a #

foldl1 :: (a -> a -> a) -> PatField a -> a #

toList :: PatField a -> [a] #

null :: PatField a -> Bool #

length :: PatField a -> Int #

elem :: Eq a => a -> PatField a -> Bool #

maximum :: Ord a => PatField a -> a #

minimum :: Ord a => PatField a -> a #

sum :: Num a => PatField a -> a #

product :: Num a => PatField a -> a #

Foldable Stmt 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => Stmt m -> m #

foldMap :: Monoid m => (a -> m) -> Stmt a -> m #

foldMap' :: Monoid m => (a -> m) -> Stmt a -> m #

foldr :: (a -> b -> b) -> b -> Stmt a -> b #

foldr' :: (a -> b -> b) -> b -> Stmt a -> b #

foldl :: (b -> a -> b) -> b -> Stmt a -> b #

foldl' :: (b -> a -> b) -> b -> Stmt a -> b #

foldr1 :: (a -> a -> a) -> Stmt a -> a #

foldl1 :: (a -> a -> a) -> Stmt a -> a #

toList :: Stmt a -> [a] #

null :: Stmt a -> Bool #

length :: Stmt a -> Int #

elem :: Eq a => a -> Stmt a -> Bool #

maximum :: Ord a => Stmt a -> a #

minimum :: Ord a => Stmt a -> a #

sum :: Num a => Stmt a -> a #

product :: Num a => Stmt a -> a #

Foldable QualStmt 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => QualStmt m -> m #

foldMap :: Monoid m => (a -> m) -> QualStmt a -> m #

foldMap' :: Monoid m => (a -> m) -> QualStmt a -> m #

foldr :: (a -> b -> b) -> b -> QualStmt a -> b #

foldr' :: (a -> b -> b) -> b -> QualStmt a -> b #

foldl :: (b -> a -> b) -> b -> QualStmt a -> b #

foldl' :: (b -> a -> b) -> b -> QualStmt a -> b #

foldr1 :: (a -> a -> a) -> QualStmt a -> a #

foldl1 :: (a -> a -> a) -> QualStmt a -> a #

toList :: QualStmt a -> [a] #

null :: QualStmt a -> Bool #

length :: QualStmt a -> Int #

elem :: Eq a => a -> QualStmt a -> Bool #

maximum :: Ord a => QualStmt a -> a #

minimum :: Ord a => QualStmt a -> a #

sum :: Num a => QualStmt a -> a #

product :: Num a => QualStmt a -> a #

Foldable FieldUpdate 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => FieldUpdate m -> m #

foldMap :: Monoid m => (a -> m) -> FieldUpdate a -> m #

foldMap' :: Monoid m => (a -> m) -> FieldUpdate a -> m #

foldr :: (a -> b -> b) -> b -> FieldUpdate a -> b #

foldr' :: (a -> b -> b) -> b -> FieldUpdate a -> b #

foldl :: (b -> a -> b) -> b -> FieldUpdate a -> b #

foldl' :: (b -> a -> b) -> b -> FieldUpdate a -> b #

foldr1 :: (a -> a -> a) -> FieldUpdate a -> a #

foldl1 :: (a -> a -> a) -> FieldUpdate a -> a #

toList :: FieldUpdate a -> [a] #

null :: FieldUpdate a -> Bool #

length :: FieldUpdate a -> Int #

elem :: Eq a => a -> FieldUpdate a -> Bool #

maximum :: Ord a => FieldUpdate a -> a #

minimum :: Ord a => FieldUpdate a -> a #

sum :: Num a => FieldUpdate a -> a #

product :: Num a => FieldUpdate a -> a #

Foldable Alt 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => Alt m -> m #

foldMap :: Monoid m => (a -> m) -> Alt a -> m #

foldMap' :: Monoid m => (a -> m) -> Alt a -> m #

foldr :: (a -> b -> b) -> b -> Alt a -> b #

foldr' :: (a -> b -> b) -> b -> Alt a -> b #

foldl :: (b -> a -> b) -> b -> Alt a -> b #

foldl' :: (b -> a -> b) -> b -> Alt a -> b #

foldr1 :: (a -> a -> a) -> Alt a -> a #

foldl1 :: (a -> a -> a) -> Alt a -> a #

toList :: Alt a -> [a] #

null :: Alt a -> Bool #

length :: Alt a -> Int #

elem :: Eq a => a -> Alt a -> Bool #

maximum :: Ord a => Alt a -> a #

minimum :: Ord a => Alt a -> a #

sum :: Num a => Alt a -> a #

product :: Num a => Alt a -> a #

Foldable HashSet 
Instance details

Defined in Data.HashSet.Base

Methods

fold :: Monoid m => HashSet m -> m #

foldMap :: Monoid m => (a -> m) -> HashSet a -> m #

foldMap' :: Monoid m => (a -> m) -> HashSet a -> m #

foldr :: (a -> b -> b) -> b -> HashSet a -> b #

foldr' :: (a -> b -> b) -> b -> HashSet a -> b #

foldl :: (b -> a -> b) -> b -> HashSet a -> b #

foldl' :: (b -> a -> b) -> b -> HashSet a -> b #

foldr1 :: (a -> a -> a) -> HashSet a -> a #

foldl1 :: (a -> a -> a) -> HashSet a -> a #

toList :: HashSet a -> [a] #

null :: HashSet a -> Bool #

length :: HashSet a -> Int #

elem :: Eq a => a -> HashSet a -> Bool #

maximum :: Ord a => HashSet a -> a #

minimum :: Ord a => HashSet a -> a #

sum :: Num a => HashSet a -> a #

product :: Num a => HashSet a -> a #

Foldable Vector 
Instance details

Defined in Data.Vector

Methods

fold :: Monoid m => Vector m -> m #

foldMap :: Monoid m => (a -> m) -> Vector a -> m #

foldMap' :: Monoid m => (a -> m) -> Vector a -> m #

foldr :: (a -> b -> b) -> b -> Vector a -> b #

foldr' :: (a -> b -> b) -> b -> Vector a -> b #

foldl :: (b -> a -> b) -> b -> Vector a -> b #

foldl' :: (b -> a -> b) -> b -> Vector a -> b #

foldr1 :: (a -> a -> a) -> Vector a -> a #

foldl1 :: (a -> a -> a) -> Vector a -> a #

toList :: Vector a -> [a] #

null :: Vector a -> Bool #

length :: Vector a -> Int #

elem :: Eq a => a -> Vector a -> Bool #

maximum :: Ord a => Vector a -> a #

minimum :: Ord a => Vector a -> a #

sum :: Num a => Vector a -> a #

product :: Num a => Vector a -> a #

Foldable SmallArray 
Instance details

Defined in Data.Primitive.SmallArray

Methods

fold :: Monoid m => SmallArray m -> m #

foldMap :: Monoid m => (a -> m) -> SmallArray a -> m #

foldMap' :: Monoid m => (a -> m) -> SmallArray a -> m #

foldr :: (a -> b -> b) -> b -> SmallArray a -> b #

foldr' :: (a -> b -> b) -> b -> SmallArray a -> b #

foldl :: (b -> a -> b) -> b -> SmallArray a -> b #

foldl' :: (b -> a -> b) -> b -> SmallArray a -> b #

foldr1 :: (a -> a -> a) -> SmallArray a -> a #

foldl1 :: (a -> a -> a) -> SmallArray a -> a #

toList :: SmallArray a -> [a] #

null :: SmallArray a -> Bool #

length :: SmallArray a -> Int #

elem :: Eq a => a -> SmallArray a -> Bool #

maximum :: Ord a => SmallArray a -> a #

minimum :: Ord a => SmallArray a -> a #

sum :: Num a => SmallArray a -> a #

product :: Num a => SmallArray a -> a #

Foldable Array 
Instance details

Defined in Data.Primitive.Array

Methods

fold :: Monoid m => Array m -> m #

foldMap :: Monoid m => (a -> m) -> Array a -> m #

foldMap' :: Monoid m => (a -> m) -> Array a -> m #

foldr :: (a -> b -> b) -> b -> Array a -> b #

foldr' :: (a -> b -> b) -> b -> Array a -> b #

foldl :: (b -> a -> b) -> b -> Array a -> b #

foldl' :: (b -> a -> b) -> b -> Array a -> b #

foldr1 :: (a -> a -> a) -> Array a -> a #

foldl1 :: (a -> a -> a) -> Array a -> a #

toList :: Array a -> [a] #

null :: Array a -> Bool #

length :: Array a -> Int #

elem :: Eq a => a -> Array a -> Bool #

maximum :: Ord a => Array a -> a #

minimum :: Ord a => Array a -> a #

sum :: Num a => Array a -> a #

product :: Num a => Array a -> a #

Foldable Identity 
Instance details

Defined in Data.Vinyl.Functor

Methods

fold :: Monoid m => Identity m -> m #

foldMap :: Monoid m => (a -> m) -> Identity a -> m #

foldMap' :: Monoid m => (a -> m) -> Identity a -> m #

foldr :: (a -> b -> b) -> b -> Identity a -> b #

foldr' :: (a -> b -> b) -> b -> Identity a -> b #

foldl :: (b -> a -> b) -> b -> Identity a -> b #

foldl' :: (b -> a -> b) -> b -> Identity a -> b #

foldr1 :: (a -> a -> a) -> Identity a -> a #

foldl1 :: (a -> a -> a) -> Identity a -> a #

toList :: Identity a -> [a] #

null :: Identity a -> Bool #

length :: Identity a -> Int #

elem :: Eq a => a -> Identity a -> Bool #

maximum :: Ord a => Identity a -> a #

minimum :: Ord a => Identity a -> a #

sum :: Num a => Identity a -> a #

product :: Num a => Identity a -> a #

Foldable Thunk 
Instance details

Defined in Data.Vinyl.Functor

Methods

fold :: Monoid m => Thunk m -> m #

foldMap :: Monoid m => (a -> m) -> Thunk a -> m #

foldMap' :: Monoid m => (a -> m) -> Thunk a -> m #

foldr :: (a -> b -> b) -> b -> Thunk a -> b #

foldr' :: (a -> b -> b) -> b -> Thunk a -> b #

foldl :: (b -> a -> b) -> b -> Thunk a -> b #

foldl' :: (b -> a -> b) -> b -> Thunk a -> b #

foldr1 :: (a -> a -> a) -> Thunk a -> a #

foldl1 :: (a -> a -> a) -> Thunk a -> a #

toList :: Thunk a -> [a] #

null :: Thunk a -> Bool #

length :: Thunk a -> Int #

elem :: Eq a => a -> Thunk a -> Bool #

maximum :: Ord a => Thunk a -> a #

minimum :: Ord a => Thunk a -> a #

sum :: Num a => Thunk a -> a #

product :: Num a => Thunk a -> a #

Foldable (Either a)

Since: base-4.7.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => Either a m -> m #

foldMap :: Monoid m => (a0 -> m) -> Either a a0 -> m #

foldMap' :: Monoid m => (a0 -> m) -> Either a a0 -> m #

foldr :: (a0 -> b -> b) -> b -> Either a a0 -> b #

foldr' :: (a0 -> b -> b) -> b -> Either a a0 -> b #

foldl :: (b -> a0 -> b) -> b -> Either a a0 -> b #

foldl' :: (b -> a0 -> b) -> b -> Either a a0 -> b #

foldr1 :: (a0 -> a0 -> a0) -> Either a a0 -> a0 #

foldl1 :: (a0 -> a0 -> a0) -> Either a a0 -> a0 #

toList :: Either a a0 -> [a0] #

null :: Either a a0 -> Bool #

length :: Either a a0 -> Int #

elem :: Eq a0 => a0 -> Either a a0 -> Bool #

maximum :: Ord a0 => Either a a0 -> a0 #

minimum :: Ord a0 => Either a a0 -> a0 #

sum :: Num a0 => Either a a0 -> a0 #

product :: Num a0 => Either a a0 -> a0 #

Foldable (V1 :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => V1 m -> m #

foldMap :: Monoid m => (a -> m) -> V1 a -> m #

foldMap' :: Monoid m => (a -> m) -> V1 a -> m #

foldr :: (a -> b -> b) -> b -> V1 a -> b #

foldr' :: (a -> b -> b) -> b -> V1 a -> b #

foldl :: (b -> a -> b) -> b -> V1 a -> b #

foldl' :: (b -> a -> b) -> b -> V1 a -> b #

foldr1 :: (a -> a -> a) -> V1 a -> a #

foldl1 :: (a -> a -> a) -> V1 a -> a #

toList :: V1 a -> [a] #

null :: V1 a -> Bool #

length :: V1 a -> Int #

elem :: Eq a => a -> V1 a -> Bool #

maximum :: Ord a => V1 a -> a #

minimum :: Ord a => V1 a -> a #

sum :: Num a => V1 a -> a #

product :: Num a => V1 a -> a #

Foldable (U1 :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => U1 m -> m #

foldMap :: Monoid m => (a -> m) -> U1 a -> m #

foldMap' :: Monoid m => (a -> m) -> U1 a -> m #

foldr :: (a -> b -> b) -> b -> U1 a -> b #

foldr' :: (a -> b -> b) -> b -> U1 a -> b #

foldl :: (b -> a -> b) -> b -> U1 a -> b #

foldl' :: (b -> a -> b) -> b -> U1 a -> b #

foldr1 :: (a -> a -> a) -> U1 a -> a #

foldl1 :: (a -> a -> a) -> U1 a -> a #

toList :: U1 a -> [a] #

null :: U1 a -> Bool #

length :: U1 a -> Int #

elem :: Eq a => a -> U1 a -> Bool #

maximum :: Ord a => U1 a -> a #

minimum :: Ord a => U1 a -> a #

sum :: Num a => U1 a -> a #

product :: Num a => U1 a -> a #

Foldable ((,) a)

Since: base-4.7.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => (a, m) -> m #

foldMap :: Monoid m => (a0 -> m) -> (a, a0) -> m #

foldMap' :: Monoid m => (a0 -> m) -> (a, a0) -> m #

foldr :: (a0 -> b -> b) -> b -> (a, a0) -> b #

foldr' :: (a0 -> b -> b) -> b -> (a, a0) -> b #

foldl :: (b -> a0 -> b) -> b -> (a, a0) -> b #

foldl' :: (b -> a0 -> b) -> b -> (a, a0) -> b #

foldr1 :: (a0 -> a0 -> a0) -> (a, a0) -> a0 #

foldl1 :: (a0 -> a0 -> a0) -> (a, a0) -> a0 #

toList :: (a, a0) -> [a0] #

null :: (a, a0) -> Bool #

length :: (a, a0) -> Int #

elem :: Eq a0 => a0 -> (a, a0) -> Bool #

maximum :: Ord a0 => (a, a0) -> a0 #

minimum :: Ord a0 => (a, a0) -> a0 #

sum :: Num a0 => (a, a0) -> a0 #

product :: Num a0 => (a, a0) -> a0 #

Foldable (HashMap k) 
Instance details

Defined in Data.HashMap.Base

Methods

fold :: Monoid m => HashMap k m -> m #

foldMap :: Monoid m => (a -> m) -> HashMap k a -> m #

foldMap' :: Monoid m => (a -> m) -> HashMap k a -> m #

foldr :: (a -> b -> b) -> b -> HashMap k a -> b #

foldr' :: (a -> b -> b) -> b -> HashMap k a -> b #

foldl :: (b -> a -> b) -> b -> HashMap k a -> b #

foldl' :: (b -> a -> b) -> b -> HashMap k a -> b #

foldr1 :: (a -> a -> a) -> HashMap k a -> a #

foldl1 :: (a -> a -> a) -> HashMap k a -> a #

toList :: HashMap k a -> [a] #

null :: HashMap k a -> Bool #

length :: HashMap k a -> Int #

elem :: Eq a => a -> HashMap k a -> Bool #

maximum :: Ord a => HashMap k a -> a #

minimum :: Ord a => HashMap k a -> a #

sum :: Num a => HashMap k a -> a #

product :: Num a => HashMap k a -> a #

Foldable (Map k)

Folds in order of increasing key.

Instance details

Defined in Data.Map.Internal

Methods

fold :: Monoid m => Map k m -> m #

foldMap :: Monoid m => (a -> m) -> Map k a -> m #

foldMap' :: Monoid m => (a -> m) -> Map k a -> m #

foldr :: (a -> b -> b) -> b -> Map k a -> b #

foldr' :: (a -> b -> b) -> b -> Map k a -> b #

foldl :: (b -> a -> b) -> b -> Map k a -> b #

foldl' :: (b -> a -> b) -> b -> Map k a -> b #

foldr1 :: (a -> a -> a) -> Map k a -> a #

foldl1 :: (a -> a -> a) -> Map k a -> a #

toList :: Map k a -> [a] #

null :: Map k a -> Bool #

length :: Map k a -> Int #

elem :: Eq a => a -> Map k a -> Bool #

maximum :: Ord a => Map k a -> a #

minimum :: Ord a => Map k a -> a #

sum :: Num a => Map k a -> a #

product :: Num a => Map k a -> a #

Foldable (Array i)

Since: base-4.8.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => Array i m -> m #

foldMap :: Monoid m => (a -> m) -> Array i a -> m #

foldMap' :: Monoid m => (a -> m) -> Array i a -> m #

foldr :: (a -> b -> b) -> b -> Array i a -> b #

foldr' :: (a -> b -> b) -> b -> Array i a -> b #

foldl :: (b -> a -> b) -> b -> Array i a -> b #

foldl' :: (b -> a -> b) -> b -> Array i a -> b #

foldr1 :: (a -> a -> a) -> Array i a -> a #

foldl1 :: (a -> a -> a) -> Array i a -> a #

toList :: Array i a -> [a] #

null :: Array i a -> Bool #

length :: Array i a -> Int #

elem :: Eq a => a -> Array i a -> Bool #

maximum :: Ord a => Array i a -> a #

minimum :: Ord a => Array i a -> a #

sum :: Num a => Array i a -> a #

product :: Num a => Array i a -> a #

Foldable (Arg a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

fold :: Monoid m => Arg a m -> m #

foldMap :: Monoid m => (a0 -> m) -> Arg a a0 -> m #

foldMap' :: Monoid m => (a0 -> m) -> Arg a a0 -> m #

foldr :: (a0 -> b -> b) -> b -> Arg a a0 -> b #

foldr' :: (a0 -> b -> b) -> b -> Arg a a0 -> b #

foldl :: (b -> a0 -> b) -> b -> Arg a a0 -> b #

foldl' :: (b -> a0 -> b) -> b -> Arg a a0 -> b #

foldr1 :: (a0 -> a0 -> a0) -> Arg a a0 -> a0 #

foldl1 :: (a0 -> a0 -> a0) -> Arg a a0 -> a0 #

toList :: Arg a a0 -> [a0] #

null :: Arg a a0 -> Bool #

length :: Arg a a0 -> Int #

elem :: Eq a0 => a0 -> Arg a a0 -> Bool #

maximum :: Ord a0 => Arg a a0 -> a0 #

minimum :: Ord a0 => Arg a a0 -> a0 #

sum :: Num a0 => Arg a a0 -> a0 #

product :: Num a0 => Arg a a0 -> a0 #

Foldable (Proxy :: Type -> Type)

Since: base-4.7.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => Proxy m -> m #

foldMap :: Monoid m => (a -> m) -> Proxy a -> m #

foldMap' :: Monoid m => (a -> m) -> Proxy a -> m #

foldr :: (a -> b -> b) -> b -> Proxy a -> b #

foldr' :: (a -> b -> b) -> b -> Proxy a -> b #

foldl :: (b -> a -> b) -> b -> Proxy a -> b #

foldl' :: (b -> a -> b) -> b -> Proxy a -> b #

foldr1 :: (a -> a -> a) -> Proxy a -> a #

foldl1 :: (a -> a -> a) -> Proxy a -> a #

toList :: Proxy a -> [a] #

null :: Proxy a -> Bool #

length :: Proxy a -> Int #

elem :: Eq a => a -> Proxy a -> Bool #

maximum :: Ord a => Proxy a -> a #

minimum :: Ord a => Proxy a -> a #

sum :: Num a => Proxy a -> a #

product :: Num a => Proxy a -> a #

Foldable f => Foldable (MaybeT f) 
Instance details

Defined in Control.Monad.Trans.Maybe

Methods

fold :: Monoid m => MaybeT f m -> m #

foldMap :: Monoid m => (a -> m) -> MaybeT f a -> m #

foldMap' :: Monoid m => (a -> m) -> MaybeT f a -> m #

foldr :: (a -> b -> b) -> b -> MaybeT f a -> b #

foldr' :: (a -> b -> b) -> b -> MaybeT f a -> b #

foldl :: (b -> a -> b) -> b -> MaybeT f a -> b #

foldl' :: (b -> a -> b) -> b -> MaybeT f a -> b #

foldr1 :: (a -> a -> a) -> MaybeT f a -> a #

foldl1 :: (a -> a -> a) -> MaybeT f a -> a #

toList :: MaybeT f a -> [a] #

null :: MaybeT f a -> Bool #

length :: MaybeT f a -> Int #

elem :: Eq a => a -> MaybeT f a -> Bool #

maximum :: Ord a => MaybeT f a -> a #

minimum :: Ord a => MaybeT f a -> a #

sum :: Num a => MaybeT f a -> a #

product :: Num a => MaybeT f a -> a #

Foldable f => Foldable (Cofree f) 
Instance details

Defined in Control.Comonad.Cofree

Methods

fold :: Monoid m => Cofree f m -> m #

foldMap :: Monoid m => (a -> m) -> Cofree f a -> m #

foldMap' :: Monoid m => (a -> m) -> Cofree f a -> m #

foldr :: (a -> b -> b) -> b -> Cofree f a -> b #

foldr' :: (a -> b -> b) -> b -> Cofree f a -> b #

foldl :: (b -> a -> b) -> b -> Cofree f a -> b #

foldl' :: (b -> a -> b) -> b -> Cofree f a -> b #

foldr1 :: (a -> a -> a) -> Cofree f a -> a #

foldl1 :: (a -> a -> a) -> Cofree f a -> a #

toList :: Cofree f a -> [a] #

null :: Cofree f a -> Bool #

length :: Cofree f a -> Int #

elem :: Eq a => a -> Cofree f a -> Bool #

maximum :: Ord a => Cofree f a -> a #

minimum :: Ord a => Cofree f a -> a #

sum :: Num a => Cofree f a -> a #

product :: Num a => Cofree f a -> a #

Foldable f => Foldable (Free f) 
Instance details

Defined in Control.Monad.Free

Methods

fold :: Monoid m => Free f m -> m #

foldMap :: Monoid m => (a -> m) -> Free f a -> m #

foldMap' :: Monoid m => (a -> m) -> Free f a -> m #

foldr :: (a -> b -> b) -> b -> Free f a -> b #

foldr' :: (a -> b -> b) -> b -> Free f a -> b #

foldl :: (b -> a -> b) -> b -> Free f a -> b #

foldl' :: (b -> a -> b) -> b -> Free f a -> b #

foldr1 :: (a -> a -> a) -> Free f a -> a #

foldl1 :: (a -> a -> a) -> Free f a -> a #

toList :: Free f a -> [a] #

null :: Free f a -> Bool #

length :: Free f a -> Int #

elem :: Eq a => a -> Free f a -> Bool #

maximum :: Ord a => Free f a -> a #

minimum :: Ord a => Free f a -> a #

sum :: Num a => Free f a -> a #

product :: Num a => Free f a -> a #

Foldable f => Foldable (Yoneda f) 
Instance details

Defined in Data.Functor.Yoneda

Methods

fold :: Monoid m => Yoneda f m -> m #

foldMap :: Monoid m => (a -> m) -> Yoneda f a -> m #

foldMap' :: Monoid m => (a -> m) -> Yoneda f a -> m #

foldr :: (a -> b -> b) -> b -> Yoneda f a -> b #

foldr' :: (a -> b -> b) -> b -> Yoneda f a -> b #

foldl :: (b -> a -> b) -> b -> Yoneda f a -> b #

foldl' :: (b -> a -> b) -> b -> Yoneda f a -> b #

foldr1 :: (a -> a -> a) -> Yoneda f a -> a #

foldl1 :: (a -> a -> a) -> Yoneda f a -> a #

toList :: Yoneda f a -> [a] #

null :: Yoneda f a -> Bool #

length :: Yoneda f a -> Int #

elem :: Eq a => a -> Yoneda f a -> Bool #

maximum :: Ord a => Yoneda f a -> a #

minimum :: Ord a => Yoneda f a -> a #

sum :: Num a => Yoneda f a -> a #

product :: Num a => Yoneda f a -> a #

Foldable f => Foldable (Rec1 f)

Since: base-4.9.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => Rec1 f m -> m #

foldMap :: Monoid m => (a -> m) -> Rec1 f a -> m #

foldMap' :: Monoid m => (a -> m) -> Rec1 f a -> m #

foldr :: (a -> b -> b) -> b -> Rec1 f a -> b #

foldr' :: (a -> b -> b) -> b -> Rec1 f a -> b #

foldl :: (b -> a -> b) -> b -> Rec1 f a -> b #

foldl' :: (b -> a -> b) -> b -> Rec1 f a -> b #

foldr1 :: (a -> a -> a) -> Rec1 f a -> a #

foldl1 :: (a -> a -> a) -> Rec1 f a -> a #

toList :: Rec1 f a -> [a] #

null :: Rec1 f a -> Bool #

length :: Rec1 f a -> Int #

elem :: Eq a => a -> Rec1 f a -> Bool #

maximum :: Ord a => Rec1 f a -> a #

minimum :: Ord a => Rec1 f a -> a #

sum :: Num a => Rec1 f a -> a #

product :: Num a => Rec1 f a -> a #

Foldable (URec Char :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => URec Char m -> m #

foldMap :: Monoid m => (a -> m) -> URec Char a -> m #

foldMap' :: Monoid m => (a -> m) -> URec Char a -> m #

foldr :: (a -> b -> b) -> b -> URec Char a -> b #

foldr' :: (a -> b -> b) -> b -> URec Char a -> b #

foldl :: (b -> a -> b) -> b -> URec Char a -> b #

foldl' :: (b -> a -> b) -> b -> URec Char a -> b #

foldr1 :: (a -> a -> a) -> URec Char a -> a #

foldl1 :: (a -> a -> a) -> URec Char a -> a #

toList :: URec Char a -> [a] #

null :: URec Char a -> Bool #

length :: URec Char a -> Int #

elem :: Eq a => a -> URec Char a -> Bool #

maximum :: Ord a => URec Char a -> a #

minimum :: Ord a => URec Char a -> a #

sum :: Num a => URec Char a -> a #

product :: Num a => URec Char a -> a #

Foldable (URec Double :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => URec Double m -> m #

foldMap :: Monoid m => (a -> m) -> URec Double a -> m #

foldMap' :: Monoid m => (a -> m) -> URec Double a -> m #

foldr :: (a -> b -> b) -> b -> URec Double a -> b #

foldr' :: (a -> b -> b) -> b -> URec Double a -> b #

foldl :: (b -> a -> b) -> b -> URec Double a -> b #

foldl' :: (b -> a -> b) -> b -> URec Double a -> b #

foldr1 :: (a -> a -> a) -> URec Double a -> a #

foldl1 :: (a -> a -> a) -> URec Double a -> a #

toList :: URec Double a -> [a] #

null :: URec Double a -> Bool #

length :: URec Double a -> Int #

elem :: Eq a => a -> URec Double a -> Bool #

maximum :: Ord a => URec Double a -> a #

minimum :: Ord a => URec Double a -> a #

sum :: Num a => URec Double a -> a #

product :: Num a => URec Double a -> a #

Foldable (URec Float :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => URec Float m -> m #

foldMap :: Monoid m => (a -> m) -> URec Float a -> m #

foldMap' :: Monoid m => (a -> m) -> URec Float a -> m #

foldr :: (a -> b -> b) -> b -> URec Float a -> b #

foldr' :: (a -> b -> b) -> b -> URec Float a -> b #

foldl :: (b -> a -> b) -> b -> URec Float a -> b #

foldl' :: (b -> a -> b) -> b -> URec Float a -> b #

foldr1 :: (a -> a -> a) -> URec Float a -> a #

foldl1 :: (a -> a -> a) -> URec Float a -> a #

toList :: URec Float a -> [a] #

null :: URec Float a -> Bool #

length :: URec Float a -> Int #

elem :: Eq a => a -> URec Float a -> Bool #

maximum :: Ord a => URec Float a -> a #

minimum :: Ord a => URec Float a -> a #

sum :: Num a => URec Float a -> a #

product :: Num a => URec Float a -> 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 #

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 #

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 #

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 #

Foldable (URec (Ptr ()) :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => URec (Ptr ()) m -> m #

foldMap :: Monoid m => (a -> m) -> URec (Ptr ()) a -> m #

foldMap' :: Monoid m => (a -> m) -> URec (Ptr ()) a -> m #

foldr :: (a -> b -> b) -> b -> URec (Ptr ()) a -> b #

foldr' :: (a -> b -> b) -> b -> URec (Ptr ()) a -> b #

foldl :: (b -> a -> b) -> b -> URec (Ptr ()) a -> b #

foldl' :: (b -> a -> b) -> b -> URec (Ptr ()) a -> b #

foldr1 :: (a -> a -> a) -> URec (Ptr ()) a -> a #

foldl1 :: (a -> a -> a) -> URec (Ptr ()) a -> a #

toList :: URec (Ptr ()) a -> [a] #

null :: URec (Ptr ()) a -> Bool #

length :: URec (Ptr ()) a -> Int #

elem :: Eq a => a -> URec (Ptr ()) a -> Bool #

maximum :: Ord a => URec (Ptr ()) a -> a #

minimum :: Ord a => URec (Ptr ()) a -> a #

sum :: Num a => URec (Ptr ()) a -> a #

product :: Num a => URec (Ptr ()) a -> a #

Foldable (Const m :: Type -> Type)

Since: base-4.7.0.0

Instance details

Defined in Data.Functor.Const

Methods

fold :: Monoid m0 => Const m m0 -> m0 #

foldMap :: Monoid m0 => (a -> m0) -> Const m a -> m0 #

foldMap' :: Monoid m0 => (a -> m0) -> Const m a -> m0 #

foldr :: (a -> b -> b) -> b -> Const m a -> b #

foldr' :: (a -> b -> b) -> b -> Const m a -> b #

foldl :: (b -> a -> b) -> b -> Const m a -> b #

foldl' :: (b -> a -> b) -> b -> Const m a -> b #

foldr1 :: (a -> a -> a) -> Const m a -> a #

foldl1 :: (a -> a -> a) -> Const m a -> a #

toList :: Const m a -> [a] #

null :: Const m a -> Bool #

length :: Const m a -> Int #

elem :: Eq a => a -> Const m a -> Bool #

maximum :: Ord a => Const m a -> a #

minimum :: Ord a => Const m a -> a #

sum :: Num a => Const m a -> a #

product :: Num a => Const m a -> 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 #

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 #

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 #

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 #

Bifoldable p => Foldable (Join p) 
Instance details

Defined in Data.Bifunctor.Join

Methods

fold :: Monoid m => Join p m -> m #

foldMap :: Monoid m => (a -> m) -> Join p a -> m #

foldMap' :: Monoid m => (a -> m) -> Join p a -> m #

foldr :: (a -> b -> b) -> b -> Join p a -> b #

foldr' :: (a -> b -> b) -> b -> Join p a -> b #

foldl :: (b -> a -> b) -> b -> Join p a -> b #

foldl' :: (b -> a -> b) -> b -> Join p a -> b #

foldr1 :: (a -> a -> a) -> Join p a -> a #

foldl1 :: (a -> a -> a) -> Join p a -> a #

toList :: Join p a -> [a] #

null :: Join p a -> Bool #

length :: Join p a -> Int #

elem :: Eq a => a -> Join p a -> Bool #

maximum :: Ord a => Join p a -> a #

minimum :: Ord a => Join p a -> a #

sum :: Num a => Join p a -> a #

product :: Num a => Join p a -> a #

Bifoldable p => Foldable (Fix p) 
Instance details

Defined in Data.Bifunctor.Fix

Methods

fold :: Monoid m => Fix p m -> m #

foldMap :: Monoid m => (a -> m) -> Fix p a -> m #

foldMap' :: Monoid m => (a -> m) -> Fix p a -> m #

foldr :: (a -> b -> b) -> b -> Fix p a -> b #

foldr' :: (a -> b -> b) -> b -> Fix p a -> b #

foldl :: (b -> a -> b) -> b -> Fix p a -> b #

foldl' :: (b -> a -> b) -> b -> Fix p a -> b #

foldr1 :: (a -> a -> a) -> Fix p a -> a #

foldl1 :: (a -> a -> a) -> Fix p a -> a #

toList :: Fix p a -> [a] #

null :: Fix p a -> Bool #

length :: Fix p a -> Int #

elem :: Eq a => a -> Fix p a -> Bool #

maximum :: Ord a => Fix p a -> a #

minimum :: Ord a => Fix p a -> a #

sum :: Num a => Fix p a -> a #

product :: Num a => Fix p a -> a #

Foldable f => Foldable (IdentityT f) 
Instance details

Defined in Control.Monad.Trans.Identity

Methods

fold :: Monoid m => IdentityT f m -> m #

foldMap :: Monoid m => (a -> m) -> IdentityT f a -> m #

foldMap' :: Monoid m => (a -> m) -> IdentityT f a -> m #

foldr :: (a -> b -> b) -> b -> IdentityT f a -> b #

foldr' :: (a -> b -> b) -> b -> IdentityT f a -> b #

foldl :: (b -> a -> b) -> b -> IdentityT f a -> b #

foldl' :: (b -> a -> b) -> b -> IdentityT f a -> b #

foldr1 :: (a -> a -> a) -> IdentityT f a -> a #

foldl1 :: (a -> a -> a) -> IdentityT f a -> a #

toList :: IdentityT f a -> [a] #

null :: IdentityT f a -> Bool #

length :: IdentityT f a -> Int #

elem :: Eq a => a -> IdentityT f a -> Bool #

maximum :: Ord a => IdentityT f a -> a #

minimum :: Ord a => IdentityT f a -> a #

sum :: Num a => IdentityT f a -> a #

product :: Num a => IdentityT f a -> a #

Foldable f => Foldable (ExceptT e f) 
Instance details

Defined in Control.Monad.Trans.Except

Methods

fold :: Monoid m => ExceptT e f m -> m #

foldMap :: Monoid m => (a -> m) -> ExceptT e f a -> m #

foldMap' :: Monoid m => (a -> m) -> ExceptT e f a -> m #

foldr :: (a -> b -> b) -> b -> ExceptT e f a -> b #

foldr' :: (a -> b -> b) -> b -> ExceptT e f a -> b #

foldl :: (b -> a -> b) -> b -> ExceptT e f a -> b #

foldl' :: (b -> a -> b) -> b -> ExceptT e f a -> b #

foldr1 :: (a -> a -> a) -> ExceptT e f a -> a #

foldl1 :: (a -> a -> a) -> ExceptT e f a -> a #

toList :: ExceptT e f a -> [a] #

null :: ExceptT e f a -> Bool #

length :: ExceptT e f a -> Int #

elem :: Eq a => a -> ExceptT e f a -> Bool #

maximum :: Ord a => ExceptT e f a -> a #

minimum :: Ord a => ExceptT e f a -> a #

sum :: Num a => ExceptT e f a -> a #

product :: Num a => ExceptT e f a -> a #

Foldable f => Foldable (FreeF f a) 
Instance details

Defined in Control.Monad.Trans.Free

Methods

fold :: Monoid m => FreeF f a m -> m #

foldMap :: Monoid m => (a0 -> m) -> FreeF f a a0 -> m #

foldMap' :: Monoid m => (a0 -> m) -> FreeF f a a0 -> m #

foldr :: (a0 -> b -> b) -> b -> FreeF f a a0 -> b #

foldr' :: (a0 -> b -> b) -> b -> FreeF f a a0 -> b #

foldl :: (b -> a0 -> b) -> b -> FreeF f a a0 -> b #

foldl' :: (b -> a0 -> b) -> b -> FreeF f a a0 -> b #

foldr1 :: (a0 -> a0 -> a0) -> FreeF f a a0 -> a0 #

foldl1 :: (a0 -> a0 -> a0) -> FreeF f a a0 -> a0 #

toList :: FreeF f a a0 -> [a0] #

null :: FreeF f a a0 -> Bool #

length :: FreeF f a a0 -> Int #

elem :: Eq a0 => a0 -> FreeF f a a0 -> Bool #

maximum :: Ord a0 => FreeF f a a0 -> a0 #

minimum :: Ord a0 => FreeF f a a0 -> a0 #

sum :: Num a0 => FreeF f a a0 -> a0 #

product :: Num a0 => FreeF f a a0 -> a0 #

(Foldable m, Foldable f) => Foldable (FreeT f m) 
Instance details

Defined in Control.Monad.Trans.Free

Methods

fold :: Monoid m0 => FreeT f m m0 -> m0 #

foldMap :: Monoid m0 => (a -> m0) -> FreeT f m a -> m0 #

foldMap' :: Monoid m0 => (a -> m0) -> FreeT f m a -> m0 #

foldr :: (a -> b -> b) -> b -> FreeT f m a -> b #

foldr' :: (a -> b -> b) -> b -> FreeT f m a -> b #

foldl :: (b -> a -> b) -> b -> FreeT f m a -> b #

foldl' :: (b -> a -> b) -> b -> FreeT f m a -> b #

foldr1 :: (a -> a -> a) -> FreeT f m a -> a #

foldl1 :: (a -> a -> a) -> FreeT f m a -> a #

toList :: FreeT f m a -> [a] #

null :: FreeT f m a -> Bool #

length :: FreeT f m a -> Int #

elem :: Eq a => a -> FreeT f m a -> Bool #

maximum :: Ord a => FreeT f m a -> a #

minimum :: Ord a => FreeT f m a -> a #

sum :: Num a => FreeT f m a -> a #

product :: Num a => FreeT f m a -> a #

Foldable f => Foldable (CofreeF f a) 
Instance details

Defined in Control.Comonad.Trans.Cofree

Methods

fold :: Monoid m => CofreeF f a m -> m #

foldMap :: Monoid m => (a0 -> m) -> CofreeF f a a0 -> m #

foldMap' :: Monoid m => (a0 -> m) -> CofreeF f a a0 -> m #

foldr :: (a0 -> b -> b) -> b -> CofreeF f a a0 -> b #

foldr' :: (a0 -> b -> b) -> b -> CofreeF f a a0 -> b #

foldl :: (b -> a0 -> b) -> b -> CofreeF f a a0 -> b #

foldl' :: (b -> a0 -> b) -> b -> CofreeF f a a0 -> b #

foldr1 :: (a0 -> a0 -> a0) -> CofreeF f a a0 -> a0 #

foldl1 :: (a0 -> a0 -> a0) -> CofreeF f a a0 -> a0 #

toList :: CofreeF f a a0 -> [a0] #

null :: CofreeF f a a0 -> Bool #

length :: CofreeF f a a0 -> Int #

elem :: Eq a0 => a0 -> CofreeF f a a0 -> Bool #

maximum :: Ord a0 => CofreeF f a a0 -> a0 #

minimum :: Ord a0 => CofreeF f a a0 -> a0 #

sum :: Num a0 => CofreeF f a a0 -> a0 #

product :: Num a0 => CofreeF f a a0 -> a0 #

(Foldable f, Foldable w) => Foldable (CofreeT f w) 
Instance details

Defined in Control.Comonad.Trans.Cofree

Methods

fold :: Monoid m => CofreeT f w m -> m #

foldMap :: Monoid m => (a -> m) -> CofreeT f w a -> m #

foldMap' :: Monoid m => (a -> m) -> CofreeT f w a -> m #

foldr :: (a -> b -> b) -> b -> CofreeT f w a -> b #

foldr' :: (a -> b -> b) -> b -> CofreeT f w a -> b #

foldl :: (b -> a -> b) -> b -> CofreeT f w a -> b #

foldl' :: (b -> a -> b) -> b -> CofreeT f w a -> b #

foldr1 :: (a -> a -> a) -> CofreeT f w a -> a #

foldl1 :: (a -> a -> a) -> CofreeT f w a -> a #

toList :: CofreeT f w a -> [a] #

null :: CofreeT f w a -> Bool #

length :: CofreeT f w a -> Int #

elem :: Eq a => a -> CofreeT f w a -> Bool #

maximum :: Ord a => CofreeT f w a -> a #

minimum :: Ord a => CofreeT f w a -> a #

sum :: Num a => CofreeT f w a -> a #

product :: Num a => CofreeT f w a -> a #

Foldable f => Foldable (ErrorT e f) 
Instance details

Defined in Control.Monad.Trans.Error

Methods

fold :: Monoid m => ErrorT e f m -> m #

foldMap :: Monoid m => (a -> m) -> ErrorT e f a -> m #

foldMap' :: Monoid m => (a -> m) -> ErrorT e f a -> m #

foldr :: (a -> b -> b) -> b -> ErrorT e f a -> b #

foldr' :: (a -> b -> b) -> b -> ErrorT e f a -> b #

foldl :: (b -> a -> b) -> b -> ErrorT e f a -> b #

foldl' :: (b -> a -> b) -> b -> ErrorT e f a -> b #

foldr1 :: (a -> a -> a) -> ErrorT e f a -> a #

foldl1 :: (a -> a -> a) -> ErrorT e f a -> a #

toList :: ErrorT e f a -> [a] #

null :: ErrorT e f a -> Bool #

length :: ErrorT e f a -> Int #

elem :: Eq a => a -> ErrorT e f a -> Bool #

maximum :: Ord a => ErrorT e f a -> a #

minimum :: Ord a => ErrorT e f a -> a #

sum :: Num a => ErrorT e f a -> a #

product :: Num a => ErrorT e f a -> 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 #

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 #

Foldable (Const a :: Type -> Type) 
Instance details

Defined in Data.Vinyl.Functor

Methods

fold :: Monoid m => Const a m -> m #

foldMap :: Monoid m => (a0 -> m) -> Const a a0 -> m #

foldMap' :: Monoid m => (a0 -> m) -> Const a a0 -> m #

foldr :: (a0 -> b -> b) -> b -> Const a a0 -> b #

foldr' :: (a0 -> b -> b) -> b -> Const a a0 -> b #

foldl :: (b -> a0 -> b) -> b -> Const a a0 -> b #

foldl' :: (b -> a0 -> b) -> b -> Const a a0 -> b #

foldr1 :: (a0 -> a0 -> a0) -> Const a a0 -> a0 #

foldl1 :: (a0 -> a0 -> a0) -> Const a a0 -> a0 #

toList :: Const a a0 -> [a0] #

null :: Const a a0 -> Bool #

length :: Const a a0 -> Int #

elem :: Eq a0 => a0 -> Const a a0 -> Bool #

maximum :: Ord a0 => Const a a0 -> a0 #

minimum :: Ord a0 => Const a a0 -> a0 #

sum :: Num a0 => Const a a0 -> a0 #

product :: Num a0 => Const a a0 -> a0 #

Foldable (K1 i c :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => K1 i c m -> m #

foldMap :: Monoid m => (a -> m) -> K1 i c a -> m #

foldMap' :: Monoid m => (a -> m) -> K1 i c a -> m #

foldr :: (a -> b -> b) -> b -> K1 i c a -> b #

foldr' :: (a -> b -> b) -> b -> K1 i c a -> b #

foldl :: (b -> a -> b) -> b -> K1 i c a -> b #

foldl' :: (b -> a -> b) -> b -> K1 i c a -> b #

foldr1 :: (a -> a -> a) -> K1 i c a -> a #

foldl1 :: (a -> a -> a) -> K1 i c a -> a #

toList :: K1 i c a -> [a] #

null :: K1 i c a -> Bool #

length :: K1 i c a -> Int #

elem :: Eq a => a -> K1 i c a -> Bool #

maximum :: Ord a => K1 i c a -> a #

minimum :: Ord a => K1 i c a -> a #

sum :: Num a => K1 i c a -> a #

product :: Num a => K1 i c a -> a #

(Foldable f, Foldable g) => Foldable (f :+: g)

Since: base-4.9.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => (f :+: g) m -> m #

foldMap :: Monoid m => (a -> m) -> (f :+: g) a -> m #

foldMap' :: Monoid m => (a -> m) -> (f :+: g) a -> m #

foldr :: (a -> b -> b) -> b -> (f :+: g) a -> b #

foldr' :: (a -> b -> b) -> b -> (f :+: g) a -> b #

foldl :: (b -> a -> b) -> b -> (f :+: g) a -> b #

foldl' :: (b -> a -> b) -> b -> (f :+: g) a -> b #

foldr1 :: (a -> a -> a) -> (f :+: g) a -> a #

foldl1 :: (a -> a -> a) -> (f :+: g) a -> a #

toList :: (f :+: g) a -> [a] #

null :: (f :+: g) a -> Bool #

length :: (f :+: g) a -> Int #

elem :: Eq a => a -> (f :+: g) a -> Bool #

maximum :: Ord a => (f :+: g) a -> a #

minimum :: Ord a => (f :+: g) a -> a #

sum :: Num a => (f :+: g) a -> a #

product :: Num a => (f :+: g) a -> a #

(Foldable f, Foldable g) => Foldable (f :*: g)

Since: base-4.9.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => (f :*: g) m -> m #

foldMap :: Monoid m => (a -> m) -> (f :*: g) a -> m #

foldMap' :: Monoid m => (a -> m) -> (f :*: g) a -> m #

foldr :: (a -> b -> b) -> b -> (f :*: g) a -> b #

foldr' :: (a -> b -> b) -> b -> (f :*: g) a -> b #

foldl :: (b -> a -> b) -> b -> (f :*: g) a -> b #

foldl' :: (b -> a -> b) -> b -> (f :*: g) a -> b #

foldr1 :: (a -> a -> a) -> (f :*: g) a -> a #

foldl1 :: (a -> a -> a) -> (f :*: g) a -> a #

toList :: (f :*: g) a -> [a] #

null :: (f :*: g) a -> Bool #

length :: (f :*: g) a -> Int #

elem :: Eq a => a -> (f :*: g) a -> Bool #

maximum :: Ord a => (f :*: g) a -> a #

minimum :: Ord a => (f :*: g) a -> a #

sum :: Num a => (f :*: g) a -> a #

product :: Num a => (f :*: g) a -> a #

(Foldable f, Foldable g) => Foldable (Product f g)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Product

Methods

fold :: Monoid m => Product f g m -> m #

foldMap :: Monoid m => (a -> m) -> Product f g a -> m #

foldMap' :: Monoid m => (a -> m) -> Product f g a -> m #

foldr :: (a -> b -> b) -> b -> Product f g a -> b #

foldr' :: (a -> b -> b) -> b -> Product f g a -> b #

foldl :: (b -> a -> b) -> b -> Product f g a -> b #

foldl' :: (b -> a -> b) -> b -> Product f g a -> b #

foldr1 :: (a -> a -> a) -> Product f g a -> a #

foldl1 :: (a -> a -> a) -> Product f g a -> a #

toList :: Product f g a -> [a] #

null :: Product f g a -> Bool #

length :: Product f g a -> Int #

elem :: Eq a => a -> Product f g a -> Bool #

maximum :: Ord a => Product f g a -> a #

minimum :: Ord a => Product f g a -> a #

sum :: Num a => Product f g a -> a #

product :: Num a => Product f g a -> a #

(Foldable f, Foldable g) => Foldable (Sum f g)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Sum

Methods

fold :: Monoid m => Sum f g m -> m #

foldMap :: Monoid m => (a -> m) -> Sum f g a -> m #

foldMap' :: Monoid m => (a -> m) -> Sum f g a -> m #

foldr :: (a -> b -> b) -> b -> Sum f g a -> b #

foldr' :: (a -> b -> b) -> b -> Sum f g a -> b #

foldl :: (b -> a -> b) -> b -> Sum f g a -> b #

foldl' :: (b -> a -> b) -> b -> Sum f g a -> b #

foldr1 :: (a -> a -> a) -> Sum f g a -> a #

foldl1 :: (a -> a -> a) -> Sum f g a -> a #

toList :: Sum f g a -> [a] #

null :: Sum f g a -> Bool #

length :: Sum f g a -> Int #

elem :: Eq a => a -> Sum f g a -> Bool #

maximum :: Ord a => Sum f g a -> a #

minimum :: Ord a => Sum f g a -> a #

sum :: Num a => Sum f g a -> a #

product :: Num a => Sum f g a -> a #

Foldable f => Foldable (M1 i c f)

Since: base-4.9.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => M1 i c f m -> m #

foldMap :: Monoid m => (a -> m) -> M1 i c f a -> m #

foldMap' :: Monoid m => (a -> m) -> M1 i c f a -> m #

foldr :: (a -> b -> b) -> b -> M1 i c f a -> b #

foldr' :: (a -> b -> b) -> b -> M1 i c f a -> b #

foldl :: (b -> a -> b) -> b -> M1 i c f a -> b #

foldl' :: (b -> a -> b) -> b -> M1 i c f a -> b #

foldr1 :: (a -> a -> a) -> M1 i c f a -> a #

foldl1 :: (a -> a -> a) -> M1 i c f a -> a #

toList :: M1 i c f a -> [a] #

null :: M1 i c f a -> Bool #

length :: M1 i c f a -> Int #

elem :: Eq a => a -> M1 i c f a -> Bool #

maximum :: Ord a => M1 i c f a -> a #

minimum :: Ord a => M1 i c f a -> a #

sum :: Num a => M1 i c f a -> a #

product :: Num a => M1 i c f a -> a #

(Foldable f, Foldable g) => Foldable (f :.: g)

Since: base-4.9.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => (f :.: g) m -> m #

foldMap :: Monoid m => (a -> m) -> (f :.: g) a -> m #

foldMap' :: Monoid m => (a -> m) -> (f :.: g) a -> m #

foldr :: (a -> b -> b) -> b -> (f :.: g) a -> b #

foldr' :: (a -> b -> b) -> b -> (f :.: g) a -> b #

foldl :: (b -> a -> b) -> b -> (f :.: g) a -> b #

foldl' :: (b -> a -> b) -> b -> (f :.: g) a -> b #

foldr1 :: (a -> a -> a) -> (f :.: g) a -> a #

foldl1 :: (a -> a -> a) -> (f :.: g) a -> a #

toList :: (f :.: g) a -> [a] #

null :: (f :.: g) a -> Bool #

length :: (f :.: g) a -> Int #

elem :: Eq a => a -> (f :.: g) a -> Bool #

maximum :: Ord a => (f :.: g) a -> a #

minimum :: Ord a => (f :.: g) a -> a #

sum :: Num a => (f :.: g) a -> a #

product :: Num a => (f :.: g) a -> a #

(Foldable f, Foldable g) => Foldable (Compose f g)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Compose

Methods

fold :: Monoid m => Compose f g m -> m #

foldMap :: Monoid m => (a -> m) -> Compose f g a -> m #

foldMap' :: Monoid m => (a -> m) -> Compose f g a -> m #

foldr :: (a -> b -> b) -> b -> Compose f g a -> b #

foldr' :: (a -> b -> b) -> b -> Compose f g a -> b #

foldl :: (b -> a -> b) -> b -> Compose f g a -> b #

foldl' :: (b -> a -> b) -> b -> Compose f g a -> b #

foldr1 :: (a -> a -> a) -> Compose f g a -> a #

foldl1 :: (a -> a -> a) -> Compose f g a -> a #

toList :: Compose f g a -> [a] #

null :: Compose f g a -> Bool #

length :: Compose f g a -> Int #

elem :: Eq a => a -> Compose f g a -> Bool #

maximum :: Ord a => Compose f g a -> a #

minimum :: Ord a => Compose f g a -> a #

sum :: Num a => Compose f g a -> a #

product :: Num a => Compose f g a -> a #

Bifoldable p => Foldable (WrappedBifunctor p a) 
Instance details

Defined in Data.Bifunctor.Wrapped

Methods

fold :: Monoid m => WrappedBifunctor p a m -> m #

foldMap :: Monoid m => (a0 -> m) -> WrappedBifunctor p a a0 -> m #

foldMap' :: Monoid m => (a0 -> m) -> WrappedBifunctor p a a0 -> m #

foldr :: (a0 -> b -> b) -> b -> WrappedBifunctor p a a0 -> b #

foldr' :: (a0 -> b -> b) -> b -> WrappedBifunctor p a a0 -> b #

foldl :: (b -> a0 -> b) -> b -> WrappedBifunctor p a a0 -> b #

foldl' :: (b -> a0 -> b) -> b -> WrappedBifunctor p a a0 -> b #

foldr1 :: (a0 -> a0 -> a0) -> WrappedBifunctor p a a0 -> a0 #

foldl1 :: (a0 -> a0 -> a0) -> WrappedBifunctor p a a0 -> a0 #

toList :: WrappedBifunctor p a a0 -> [a0] #

null :: WrappedBifunctor p a a0 -> Bool #

length :: WrappedBifunctor p a a0 -> Int #

elem :: Eq a0 => a0 -> WrappedBifunctor p a a0 -> Bool #

maximum :: Ord a0 => WrappedBifunctor p a a0 -> a0 #

minimum :: Ord a0 => WrappedBifunctor p a a0 -> a0 #

sum :: Num a0 => WrappedBifunctor p a a0 -> a0 #

product :: Num a0 => WrappedBifunctor p a a0 -> a0 #

Foldable g => Foldable (Joker g a) 
Instance details

Defined in Data.Bifunctor.Joker

Methods

fold :: Monoid m => Joker g a m -> m #

foldMap :: Monoid m => (a0 -> m) -> Joker g a a0 -> m #

foldMap' :: Monoid m => (a0 -> m) -> Joker g a a0 -> m #

foldr :: (a0 -> b -> b) -> b -> Joker g a a0 -> b #

foldr' :: (a0 -> b -> b) -> b -> Joker g a a0 -> b #

foldl :: (b -> a0 -> b) -> b -> Joker g a a0 -> b #

foldl' :: (b -> a0 -> b) -> b -> Joker g a a0 -> b #

foldr1 :: (a0 -> a0 -> a0) -> Joker g a a0 -> a0 #

foldl1 :: (a0 -> a0 -> a0) -> Joker g a a0 -> a0 #

toList :: Joker g a a0 -> [a0] #

null :: Joker g a a0 -> Bool #

length :: Joker g a a0 -> Int #

elem :: Eq a0 => a0 -> Joker g a a0 -> Bool #

maximum :: Ord a0 => Joker g a a0 -> a0 #

minimum :: Ord a0 => Joker g a a0 -> a0 #

sum :: Num a0 => Joker g a a0 -> a0 #

product :: Num a0 => Joker g a a0 -> a0 #

Bifoldable p => Foldable (Flip p a) 
Instance details

Defined in Data.Bifunctor.Flip

Methods

fold :: Monoid m => Flip p a m -> m #

foldMap :: Monoid m => (a0 -> m) -> Flip p a a0 -> m #

foldMap' :: Monoid m => (a0 -> m) -> Flip p a a0 -> m #

foldr :: (a0 -> b -> b) -> b -> Flip p a a0 -> b #

foldr' :: (a0 -> b -> b) -> b -> Flip p a a0 -> b #

foldl :: (b -> a0 -> b) -> b -> Flip p a a0 -> b #

foldl' :: (b -> a0 -> b) -> b -> Flip p a a0 -> b #

foldr1 :: (a0 -> a0 -> a0) -> Flip p a a0 -> a0 #

foldl1 :: (a0 -> a0 -> a0) -> Flip p a a0 -> a0 #

toList :: Flip p a a0 -> [a0] #

null :: Flip p a a0 -> Bool #

length :: Flip p a a0 -> Int #

elem :: Eq a0 => a0 -> Flip p a a0 -> Bool #

maximum :: Ord a0 => Flip p a a0 -> a0 #

minimum :: Ord a0 => Flip p a a0 -> a0 #

sum :: Num a0 => Flip p a a0 -> a0 #

product :: Num a0 => Flip p a a0 -> a0 #

Foldable (Clown f a :: Type -> Type) 
Instance details

Defined in Data.Bifunctor.Clown

Methods

fold :: Monoid m => Clown f a m -> m #

foldMap :: Monoid m => (a0 -> m) -> Clown f a a0 -> m #

foldMap' :: Monoid m => (a0 -> m) -> Clown f a a0 -> m #

foldr :: (a0 -> b -> b) -> b -> Clown f a a0 -> b #

foldr' :: (a0 -> b -> b) -> b -> Clown f a a0 -> b #

foldl :: (b -> a0 -> b) -> b -> Clown f a a0 -> b #

foldl' :: (b -> a0 -> b) -> b -> Clown f a a0 -> b #

foldr1 :: (a0 -> a0 -> a0) -> Clown f a a0 -> a0 #

foldl1 :: (a0 -> a0 -> a0) -> Clown f a a0 -> a0 #

toList :: Clown f a a0 -> [a0] #

null :: Clown f a a0 -> Bool #

length :: Clown f a a0 -> Int #

elem :: Eq a0 => a0 -> Clown f a a0 -> Bool #

maximum :: Ord a0 => Clown f a a0 -> a0 #

minimum :: Ord a0 => Clown f a a0 -> a0 #

sum :: Num a0 => Clown f a a0 -> a0 #

product :: Num a0 => Clown f a a0 -> a0 #

(Foldable f, Foldable g) => Foldable (Compose f g) 
Instance details

Defined in Data.Vinyl.Functor

Methods

fold :: Monoid m => Compose f g m -> m #

foldMap :: Monoid m => (a -> m) -> Compose f g a -> m #

foldMap' :: Monoid m => (a -> m) -> Compose f g a -> m #

foldr :: (a -> b -> b) -> b -> Compose f g a -> b #

foldr' :: (a -> b -> b) -> b -> Compose f g a -> b #

foldl :: (b -> a -> b) -> b -> Compose f g a -> b #

foldl' :: (b -> a -> b) -> b -> Compose f g a -> b #

foldr1 :: (a -> a -> a) -> Compose f g a -> a #

foldl1 :: (a -> a -> a) -> Compose f g a -> a #

toList :: Compose f g a -> [a] #

null :: Compose f g a -> Bool #

length :: Compose f g a -> Int #

elem :: Eq a => a -> Compose f g a -> Bool #

maximum :: Ord a => Compose f g a -> a #

minimum :: Ord a => Compose f g a -> a #

sum :: Num a => Compose f g a -> a #

product :: Num a => Compose f g a -> a #

(Foldable f, Bifoldable p) => Foldable (Tannen f p a) 
Instance details

Defined in Data.Bifunctor.Tannen

Methods

fold :: Monoid m => Tannen f p a m -> m #

foldMap :: Monoid m => (a0 -> m) -> Tannen f p a a0 -> m #

foldMap' :: Monoid m => (a0 -> m) -> Tannen f p a a0 -> m #

foldr :: (a0 -> b -> b) -> b -> Tannen f p a a0 -> b #

foldr' :: (a0 -> b -> b) -> b -> Tannen f p a a0 -> b #

foldl :: (b -> a0 -> b) -> b -> Tannen f p a a0 -> b #

foldl' :: (b -> a0 -> b) -> b -> Tannen f p a a0 -> b #

foldr1 :: (a0 -> a0 -> a0) -> Tannen f p a a0 -> a0 #

foldl1 :: (a0 -> a0 -> a0) -> Tannen f p a a0 -> a0 #

toList :: Tannen f p a a0 -> [a0] #

null :: Tannen f p a a0 -> Bool #

length :: Tannen f p a a0 -> Int #

elem :: Eq a0 => a0 -> Tannen f p a a0 -> Bool #

maximum :: Ord a0 => Tannen f p a a0 -> a0 #

minimum :: Ord a0 => Tannen f p a a0 -> a0 #

sum :: Num a0 => Tannen f p a a0 -> a0 #

product :: Num a0 => Tannen f p a a0 -> a0 #

(Bifoldable p, Foldable g) => Foldable (Biff p f g a) 
Instance details

Defined in Data.Bifunctor.Biff

Methods

fold :: Monoid m => Biff p f g a m -> m #

foldMap :: Monoid m => (a0 -> m) -> Biff p f g a a0 -> m #

foldMap' :: Monoid m => (a0 -> m) -> Biff p f g a a0 -> m #

foldr :: (a0 -> b -> b) -> b -> Biff p f g a a0 -> b #

foldr' :: (a0 -> b -> b) -> b -> Biff p f g a a0 -> b #

foldl :: (b -> a0 -> b) -> b -> Biff p f g a a0 -> b #

foldl' :: (b -> a0 -> b) -> b -> Biff p f g a a0 -> b #

foldr1 :: (a0 -> a0 -> a0) -> Biff p f g a a0 -> a0 #

foldl1 :: (a0 -> a0 -> a0) -> Biff p f g a a0 -> a0 #

toList :: Biff p f g a a0 -> [a0] #

null :: Biff p f g a a0 -> Bool #

length :: Biff p f g a a0 -> Int #

elem :: Eq a0 => a0 -> Biff p f g a a0 -> Bool #

maximum :: Ord a0 => Biff p f g a a0 -> a0 #

minimum :: Ord a0 => Biff p f g a a0 -> a0 #

sum :: Num a0 => Biff p f g a a0 -> a0 #

product :: Num a0 => Biff p f g a a0 -> a0 #

class (Functor t, Foldable t) => Traversable (t :: Type -> Type) where #

Functors representing data structures that can be traversed from left to right.

A definition of traverse must satisfy the following laws:

Naturality
t . traverse f = traverse (t . f) for every applicative transformation t
Identity
traverse Identity = Identity
Composition
traverse (Compose . fmap g . f) = Compose . fmap (traverse g) . traverse f

A definition of sequenceA must satisfy the following laws:

Naturality
t . sequenceA = sequenceA . fmap t for every applicative transformation t
Identity
sequenceA . fmap Identity = Identity
Composition
sequenceA . fmap Compose = Compose . fmap sequenceA . sequenceA

where an applicative transformation is a function

t :: (Applicative f, Applicative g) => f a -> g a

preserving the Applicative operations, i.e.

t (pure x) = pure x
t (f <*> x) = t f <*> t x

and the identity functor Identity and composition functors Compose are from Data.Functor.Identity and Data.Functor.Compose.

(The naturality law is implied by parametricity.)

Instances are similar to Functor, e.g. given a data type

data Tree a = Empty | Leaf a | Node (Tree a) a (Tree a)

a suitable instance would be

instance Traversable Tree where
   traverse f Empty = pure Empty
   traverse f (Leaf x) = Leaf <$> f x
   traverse f (Node l k r) = Node <$> traverse f l <*> f k <*> traverse f r

This is suitable even for abstract types, as the laws for <*> imply a form of associativity.

The superclass instances should satisfy the following:

Minimal complete definition

traverse | sequenceA

Methods

traverse :: Applicative f => (a -> f b) -> t a -> f (t b) #

Map each element of a structure to an action, evaluate these actions from left to right, and collect the results. For a version that ignores the results see traverse_.

sequenceA :: Applicative f => t (f a) -> f (t a) #

Evaluate each action in the structure from left to right, and collect the results. For a version that ignores the results see sequenceA_.

mapM :: Monad m => (a -> m b) -> t a -> m (t b) #

Map each element of a structure to a monadic action, evaluate these actions from left to right, and collect the results. For a version that ignores the results see mapM_.

sequence :: Monad m => t (m a) -> m (t a) #

Evaluate each monadic action in the structure from left to right, and collect the results. For a version that ignores the results see sequence_.

Instances

Instances details
Traversable []

Since: base-2.1

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> [a] -> f [b] #

sequenceA :: Applicative f => [f a] -> f [a] #

mapM :: Monad m => (a -> m b) -> [a] -> m [b] #

sequence :: Monad m => [m a] -> m [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) #

Traversable Par1

Since: base-4.9.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> Par1 a -> f (Par1 b) #

sequenceA :: Applicative f => Par1 (f a) -> f (Par1 a) #

mapM :: Monad m => (a -> m b) -> Par1 a -> m (Par1 b) #

sequence :: Monad m => Par1 (m a) -> m (Par1 a) #

Traversable IResult 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

traverse :: Applicative f => (a -> f b) -> IResult a -> f (IResult b) #

sequenceA :: Applicative f => IResult (f a) -> f (IResult a) #

mapM :: Monad m => (a -> m b) -> IResult a -> m (IResult b) #

sequence :: Monad m => IResult (m a) -> m (IResult a) #

Traversable Result 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

traverse :: Applicative f => (a -> f b) -> Result a -> f (Result b) #

sequenceA :: Applicative f => Result (f a) -> f (Result a) #

mapM :: Monad m => (a -> m b) -> Result a -> m (Result b) #

sequence :: Monad m => Result (m a) -> m (Result a) #

Traversable Complex

Since: base-4.9.0.0

Instance details

Defined in Data.Complex

Methods

traverse :: Applicative f => (a -> f b) -> Complex a -> f (Complex b) #

sequenceA :: Applicative f => Complex (f a) -> f (Complex a) #

mapM :: Monad m => (a -> m b) -> Complex a -> m (Complex b) #

sequence :: Monad m => Complex (m a) -> m (Complex a) #

Traversable Min

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

traverse :: Applicative f => (a -> f b) -> Min a -> f (Min b) #

sequenceA :: Applicative f => Min (f a) -> f (Min a) #

mapM :: Monad m => (a -> m b) -> Min a -> m (Min b) #

sequence :: Monad m => Min (m a) -> m (Min a) #

Traversable Max

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

traverse :: Applicative f => (a -> f b) -> Max a -> f (Max b) #

sequenceA :: Applicative f => Max (f a) -> f (Max a) #

mapM :: Monad m => (a -> m b) -> Max a -> m (Max b) #

sequence :: Monad m => Max (m a) -> m (Max a) #

Traversable First

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

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) #

Traversable Last

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

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) #

Traversable Option

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

traverse :: Applicative f => (a -> f b) -> Option a -> f (Option b) #

sequenceA :: Applicative f => Option (f a) -> f (Option a) #

mapM :: Monad m => (a -> m b) -> Option a -> m (Option b) #

sequence :: Monad m => Option (m a) -> m (Option a) #

Traversable ZipList

Since: base-4.9.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> ZipList a -> f (ZipList b) #

sequenceA :: Applicative f => ZipList (f a) -> f (ZipList a) #

mapM :: Monad m => (a -> m b) -> ZipList a -> m (ZipList b) #

sequence :: Monad m => ZipList (m a) -> m (ZipList a) #

Traversable Identity

Since: base-4.9.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> Identity a -> f (Identity b) #

sequenceA :: Applicative f => Identity (f a) -> f (Identity a) #

mapM :: Monad m => (a -> m b) -> Identity a -> m (Identity b) #

sequence :: Monad m => Identity (m a) -> m (Identity 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) #

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) #

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) #

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) #

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) #

Traversable Down

Since: base-4.12.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> Down a -> f (Down b) #

sequenceA :: Applicative f => Down (f a) -> f (Down a) #

mapM :: Monad m => (a -> m b) -> Down a -> m (Down b) #

sequence :: Monad m => Down (m a) -> m (Down a) #

Traversable NonEmpty

Since: base-4.9.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> NonEmpty a -> f (NonEmpty b) #

sequenceA :: Applicative f => NonEmpty (f a) -> f (NonEmpty a) #

mapM :: Monad m => (a -> m b) -> NonEmpty a -> m (NonEmpty b) #

sequence :: Monad m => NonEmpty (m a) -> m (NonEmpty a) #

Traversable IntMap

Traverses in order of increasing key.

Instance details

Defined in Data.IntMap.Internal

Methods

traverse :: Applicative f => (a -> f b) -> IntMap a -> f (IntMap b) #

sequenceA :: Applicative f => IntMap (f a) -> f (IntMap a) #

mapM :: Monad m => (a -> m b) -> IntMap a -> m (IntMap b) #

sequence :: Monad m => IntMap (m a) -> m (IntMap a) #

Traversable Tree 
Instance details

Defined in Data.Tree

Methods

traverse :: Applicative f => (a -> f b) -> Tree a -> f (Tree b) #

sequenceA :: Applicative f => Tree (f a) -> f (Tree a) #

mapM :: Monad m => (a -> m b) -> Tree a -> m (Tree b) #

sequence :: Monad m => Tree (m a) -> m (Tree a) #

Traversable Seq 
Instance details

Defined in Data.Sequence.Internal

Methods

traverse :: Applicative f => (a -> f b) -> Seq a -> f (Seq b) #

sequenceA :: Applicative f => Seq (f a) -> f (Seq a) #

mapM :: Monad m => (a -> m b) -> Seq a -> m (Seq b) #

sequence :: Monad m => Seq (m a) -> m (Seq a) #

Traversable FingerTree 
Instance details

Defined in Data.Sequence.Internal

Methods

traverse :: Applicative f => (a -> f b) -> FingerTree a -> f (FingerTree b) #

sequenceA :: Applicative f => FingerTree (f a) -> f (FingerTree a) #

mapM :: Monad m => (a -> m b) -> FingerTree a -> m (FingerTree b) #

sequence :: Monad m => FingerTree (m a) -> m (FingerTree a) #

Traversable Digit 
Instance details

Defined in Data.Sequence.Internal

Methods

traverse :: Applicative f => (a -> f b) -> Digit a -> f (Digit b) #

sequenceA :: Applicative f => Digit (f a) -> f (Digit a) #

mapM :: Monad m => (a -> m b) -> Digit a -> m (Digit b) #

sequence :: Monad m => Digit (m a) -> m (Digit a) #

Traversable Node 
Instance details

Defined in Data.Sequence.Internal

Methods

traverse :: Applicative f => (a -> f b) -> Node a -> f (Node b) #

sequenceA :: Applicative f => Node (f a) -> f (Node a) #

mapM :: Monad m => (a -> m b) -> Node a -> m (Node b) #

sequence :: Monad m => Node (m a) -> m (Node a) #

Traversable Elem 
Instance details

Defined in Data.Sequence.Internal

Methods

traverse :: Applicative f => (a -> f b) -> Elem a -> f (Elem b) #

sequenceA :: Applicative f => Elem (f a) -> f (Elem a) #

mapM :: Monad m => (a -> m b) -> Elem a -> m (Elem b) #

sequence :: Monad m => Elem (m a) -> m (Elem a) #

Traversable ViewL 
Instance details

Defined in Data.Sequence.Internal

Methods

traverse :: Applicative f => (a -> f b) -> ViewL a -> f (ViewL b) #

sequenceA :: Applicative f => ViewL (f a) -> f (ViewL a) #

mapM :: Monad m => (a -> m b) -> ViewL a -> m (ViewL b) #

sequence :: Monad m => ViewL (m a) -> m (ViewL a) #

Traversable ViewR 
Instance details

Defined in Data.Sequence.Internal

Methods

traverse :: Applicative f => (a -> f b) -> ViewR a -> f (ViewR b) #

sequenceA :: Applicative f => ViewR (f a) -> f (ViewR a) #

mapM :: Monad m => (a -> m b) -> ViewR a -> m (ViewR b) #

sequence :: Monad m => ViewR (m a) -> m (ViewR a) #

Traversable ModuleName 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> ModuleName a -> f (ModuleName b) #

sequenceA :: Applicative f => ModuleName (f a) -> f (ModuleName a) #

mapM :: Monad m => (a -> m b) -> ModuleName a -> m (ModuleName b) #

sequence :: Monad m => ModuleName (m a) -> m (ModuleName a) #

Traversable SpecialCon 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> SpecialCon a -> f (SpecialCon b) #

sequenceA :: Applicative f => SpecialCon (f a) -> f (SpecialCon a) #

mapM :: Monad m => (a -> m b) -> SpecialCon a -> m (SpecialCon b) #

sequence :: Monad m => SpecialCon (m a) -> m (SpecialCon a) #

Traversable QName 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> QName a -> f (QName b) #

sequenceA :: Applicative f => QName (f a) -> f (QName a) #

mapM :: Monad m => (a -> m b) -> QName a -> m (QName b) #

sequence :: Monad m => QName (m a) -> m (QName a) #

Traversable Name 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> Name a -> f (Name b) #

sequenceA :: Applicative f => Name (f a) -> f (Name a) #

mapM :: Monad m => (a -> m b) -> Name a -> m (Name b) #

sequence :: Monad m => Name (m a) -> m (Name a) #

Traversable IPName 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> IPName a -> f (IPName b) #

sequenceA :: Applicative f => IPName (f a) -> f (IPName a) #

mapM :: Monad m => (a -> m b) -> IPName a -> m (IPName b) #

sequence :: Monad m => IPName (m a) -> m (IPName a) #

Traversable QOp 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> QOp a -> f (QOp b) #

sequenceA :: Applicative f => QOp (f a) -> f (QOp a) #

mapM :: Monad m => (a -> m b) -> QOp a -> m (QOp b) #

sequence :: Monad m => QOp (m a) -> m (QOp a) #

Traversable Op 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> Op a -> f (Op b) #

sequenceA :: Applicative f => Op (f a) -> f (Op a) #

mapM :: Monad m => (a -> m b) -> Op a -> m (Op b) #

sequence :: Monad m => Op (m a) -> m (Op a) #

Traversable CName 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> CName a -> f (CName b) #

sequenceA :: Applicative f => CName (f a) -> f (CName a) #

mapM :: Monad m => (a -> m b) -> CName a -> m (CName b) #

sequence :: Monad m => CName (m a) -> m (CName a) #

Traversable Module 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> Module a -> f (Module b) #

sequenceA :: Applicative f => Module (f a) -> f (Module a) #

mapM :: Monad m => (a -> m b) -> Module a -> m (Module b) #

sequence :: Monad m => Module (m a) -> m (Module a) #

Traversable ModuleHead 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> ModuleHead a -> f (ModuleHead b) #

sequenceA :: Applicative f => ModuleHead (f a) -> f (ModuleHead a) #

mapM :: Monad m => (a -> m b) -> ModuleHead a -> m (ModuleHead b) #

sequence :: Monad m => ModuleHead (m a) -> m (ModuleHead a) #

Traversable ExportSpecList 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> ExportSpecList a -> f (ExportSpecList b) #

sequenceA :: Applicative f => ExportSpecList (f a) -> f (ExportSpecList a) #

mapM :: Monad m => (a -> m b) -> ExportSpecList a -> m (ExportSpecList b) #

sequence :: Monad m => ExportSpecList (m a) -> m (ExportSpecList a) #

Traversable ExportSpec 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> ExportSpec a -> f (ExportSpec b) #

sequenceA :: Applicative f => ExportSpec (f a) -> f (ExportSpec a) #

mapM :: Monad m => (a -> m b) -> ExportSpec a -> m (ExportSpec b) #

sequence :: Monad m => ExportSpec (m a) -> m (ExportSpec a) #

Traversable EWildcard 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> EWildcard a -> f (EWildcard b) #

sequenceA :: Applicative f => EWildcard (f a) -> f (EWildcard a) #

mapM :: Monad m => (a -> m b) -> EWildcard a -> m (EWildcard b) #

sequence :: Monad m => EWildcard (m a) -> m (EWildcard a) #

Traversable Namespace 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> Namespace a -> f (Namespace b) #

sequenceA :: Applicative f => Namespace (f a) -> f (Namespace a) #

mapM :: Monad m => (a -> m b) -> Namespace a -> m (Namespace b) #

sequence :: Monad m => Namespace (m a) -> m (Namespace a) #

Traversable ImportDecl 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> ImportDecl a -> f (ImportDecl b) #

sequenceA :: Applicative f => ImportDecl (f a) -> f (ImportDecl a) #

mapM :: Monad m => (a -> m b) -> ImportDecl a -> m (ImportDecl b) #

sequence :: Monad m => ImportDecl (m a) -> m (ImportDecl a) #

Traversable ImportSpecList 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> ImportSpecList a -> f (ImportSpecList b) #

sequenceA :: Applicative f => ImportSpecList (f a) -> f (ImportSpecList a) #

mapM :: Monad m => (a -> m b) -> ImportSpecList a -> m (ImportSpecList b) #

sequence :: Monad m => ImportSpecList (m a) -> m (ImportSpecList a) #

Traversable ImportSpec 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> ImportSpec a -> f (ImportSpec b) #

sequenceA :: Applicative f => ImportSpec (f a) -> f (ImportSpec a) #

mapM :: Monad m => (a -> m b) -> ImportSpec a -> m (ImportSpec b) #

sequence :: Monad m => ImportSpec (m a) -> m (ImportSpec a) #

Traversable Assoc 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> Assoc a -> f (Assoc b) #

sequenceA :: Applicative f => Assoc (f a) -> f (Assoc a) #

mapM :: Monad m => (a -> m b) -> Assoc a -> m (Assoc b) #

sequence :: Monad m => Assoc (m a) -> m (Assoc a) #

Traversable Decl 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> Decl a -> f (Decl b) #

sequenceA :: Applicative f => Decl (f a) -> f (Decl a) #

mapM :: Monad m => (a -> m b) -> Decl a -> m (Decl b) #

sequence :: Monad m => Decl (m a) -> m (Decl a) #

Traversable PatternSynDirection 
Instance details

Defined in Language.Haskell.Exts.Syntax

Traversable TypeEqn 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> TypeEqn a -> f (TypeEqn b) #

sequenceA :: Applicative f => TypeEqn (f a) -> f (TypeEqn a) #

mapM :: Monad m => (a -> m b) -> TypeEqn a -> m (TypeEqn b) #

sequence :: Monad m => TypeEqn (m a) -> m (TypeEqn a) #

Traversable Annotation 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> Annotation a -> f (Annotation b) #

sequenceA :: Applicative f => Annotation (f a) -> f (Annotation a) #

mapM :: Monad m => (a -> m b) -> Annotation a -> m (Annotation b) #

sequence :: Monad m => Annotation (m a) -> m (Annotation a) #

Traversable BooleanFormula 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> BooleanFormula a -> f (BooleanFormula b) #

sequenceA :: Applicative f => BooleanFormula (f a) -> f (BooleanFormula a) #

mapM :: Monad m => (a -> m b) -> BooleanFormula a -> m (BooleanFormula b) #

sequence :: Monad m => BooleanFormula (m a) -> m (BooleanFormula a) #

Traversable Role 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> Role a -> f (Role b) #

sequenceA :: Applicative f => Role (f a) -> f (Role a) #

mapM :: Monad m => (a -> m b) -> Role a -> m (Role b) #

sequence :: Monad m => Role (m a) -> m (Role a) #

Traversable DataOrNew 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> DataOrNew a -> f (DataOrNew b) #

sequenceA :: Applicative f => DataOrNew (f a) -> f (DataOrNew a) #

mapM :: Monad m => (a -> m b) -> DataOrNew a -> m (DataOrNew b) #

sequence :: Monad m => DataOrNew (m a) -> m (DataOrNew a) #

Traversable InjectivityInfo 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> InjectivityInfo a -> f (InjectivityInfo b) #

sequenceA :: Applicative f => InjectivityInfo (f a) -> f (InjectivityInfo a) #

mapM :: Monad m => (a -> m b) -> InjectivityInfo a -> m (InjectivityInfo b) #

sequence :: Monad m => InjectivityInfo (m a) -> m (InjectivityInfo a) #

Traversable ResultSig 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> ResultSig a -> f (ResultSig b) #

sequenceA :: Applicative f => ResultSig (f a) -> f (ResultSig a) #

mapM :: Monad m => (a -> m b) -> ResultSig a -> m (ResultSig b) #

sequence :: Monad m => ResultSig (m a) -> m (ResultSig a) #

Traversable DeclHead 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> DeclHead a -> f (DeclHead b) #

sequenceA :: Applicative f => DeclHead (f a) -> f (DeclHead a) #

mapM :: Monad m => (a -> m b) -> DeclHead a -> m (DeclHead b) #

sequence :: Monad m => DeclHead (m a) -> m (DeclHead a) #

Traversable InstRule 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> InstRule a -> f (InstRule b) #

sequenceA :: Applicative f => InstRule (f a) -> f (InstRule a) #

mapM :: Monad m => (a -> m b) -> InstRule a -> m (InstRule b) #

sequence :: Monad m => InstRule (m a) -> m (InstRule a) #

Traversable InstHead 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> InstHead a -> f (InstHead b) #

sequenceA :: Applicative f => InstHead (f a) -> f (InstHead a) #

mapM :: Monad m => (a -> m b) -> InstHead a -> m (InstHead b) #

sequence :: Monad m => InstHead (m a) -> m (InstHead a) #

Traversable Deriving 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> Deriving a -> f (Deriving b) #

sequenceA :: Applicative f => Deriving (f a) -> f (Deriving a) #

mapM :: Monad m => (a -> m b) -> Deriving a -> m (Deriving b) #

sequence :: Monad m => Deriving (m a) -> m (Deriving a) #

Traversable DerivStrategy 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> DerivStrategy a -> f (DerivStrategy b) #

sequenceA :: Applicative f => DerivStrategy (f a) -> f (DerivStrategy a) #

mapM :: Monad m => (a -> m b) -> DerivStrategy a -> m (DerivStrategy b) #

sequence :: Monad m => DerivStrategy (m a) -> m (DerivStrategy a) #

Traversable Binds 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> Binds a -> f (Binds b) #

sequenceA :: Applicative f => Binds (f a) -> f (Binds a) #

mapM :: Monad m => (a -> m b) -> Binds a -> m (Binds b) #

sequence :: Monad m => Binds (m a) -> m (Binds a) #

Traversable IPBind 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> IPBind a -> f (IPBind b) #

sequenceA :: Applicative f => IPBind (f a) -> f (IPBind a) #

mapM :: Monad m => (a -> m b) -> IPBind a -> m (IPBind b) #

sequence :: Monad m => IPBind (m a) -> m (IPBind a) #

Traversable Match 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> Match a -> f (Match b) #

sequenceA :: Applicative f => Match (f a) -> f (Match a) #

mapM :: Monad m => (a -> m b) -> Match a -> m (Match b) #

sequence :: Monad m => Match (m a) -> m (Match a) #

Traversable QualConDecl 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> QualConDecl a -> f (QualConDecl b) #

sequenceA :: Applicative f => QualConDecl (f a) -> f (QualConDecl a) #

mapM :: Monad m => (a -> m b) -> QualConDecl a -> m (QualConDecl b) #

sequence :: Monad m => QualConDecl (m a) -> m (QualConDecl a) #

Traversable ConDecl 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> ConDecl a -> f (ConDecl b) #

sequenceA :: Applicative f => ConDecl (f a) -> f (ConDecl a) #

mapM :: Monad m => (a -> m b) -> ConDecl a -> m (ConDecl b) #

sequence :: Monad m => ConDecl (m a) -> m (ConDecl a) #

Traversable FieldDecl 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> FieldDecl a -> f (FieldDecl b) #

sequenceA :: Applicative f => FieldDecl (f a) -> f (FieldDecl a) #

mapM :: Monad m => (a -> m b) -> FieldDecl a -> m (FieldDecl b) #

sequence :: Monad m => FieldDecl (m a) -> m (FieldDecl a) #

Traversable GadtDecl 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> GadtDecl a -> f (GadtDecl b) #

sequenceA :: Applicative f => GadtDecl (f a) -> f (GadtDecl a) #

mapM :: Monad m => (a -> m b) -> GadtDecl a -> m (GadtDecl b) #

sequence :: Monad m => GadtDecl (m a) -> m (GadtDecl a) #

Traversable ClassDecl 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> ClassDecl a -> f (ClassDecl b) #

sequenceA :: Applicative f => ClassDecl (f a) -> f (ClassDecl a) #

mapM :: Monad m => (a -> m b) -> ClassDecl a -> m (ClassDecl b) #

sequence :: Monad m => ClassDecl (m a) -> m (ClassDecl a) #

Traversable InstDecl 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> InstDecl a -> f (InstDecl b) #

sequenceA :: Applicative f => InstDecl (f a) -> f (InstDecl a) #

mapM :: Monad m => (a -> m b) -> InstDecl a -> m (InstDecl b) #

sequence :: Monad m => InstDecl (m a) -> m (InstDecl a) #

Traversable BangType 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> BangType a -> f (BangType b) #

sequenceA :: Applicative f => BangType (f a) -> f (BangType a) #

mapM :: Monad m => (a -> m b) -> BangType a -> m (BangType b) #

sequence :: Monad m => BangType (m a) -> m (BangType a) #

Traversable Unpackedness 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> Unpackedness a -> f (Unpackedness b) #

sequenceA :: Applicative f => Unpackedness (f a) -> f (Unpackedness a) #

mapM :: Monad m => (a -> m b) -> Unpackedness a -> m (Unpackedness b) #

sequence :: Monad m => Unpackedness (m a) -> m (Unpackedness a) #

Traversable Rhs 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> Rhs a -> f (Rhs b) #

sequenceA :: Applicative f => Rhs (f a) -> f (Rhs a) #

mapM :: Monad m => (a -> m b) -> Rhs a -> m (Rhs b) #

sequence :: Monad m => Rhs (m a) -> m (Rhs a) #

Traversable GuardedRhs 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> GuardedRhs a -> f (GuardedRhs b) #

sequenceA :: Applicative f => GuardedRhs (f a) -> f (GuardedRhs a) #

mapM :: Monad m => (a -> m b) -> GuardedRhs a -> m (GuardedRhs b) #

sequence :: Monad m => GuardedRhs (m a) -> m (GuardedRhs a) #

Traversable Type 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> Type a -> f (Type b) #

sequenceA :: Applicative f => Type (f a) -> f (Type a) #

mapM :: Monad m => (a -> m b) -> Type a -> m (Type b) #

sequence :: Monad m => Type (m a) -> m (Type a) #

Traversable MaybePromotedName 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> MaybePromotedName a -> f (MaybePromotedName b) #

sequenceA :: Applicative f => MaybePromotedName (f a) -> f (MaybePromotedName a) #

mapM :: Monad m => (a -> m b) -> MaybePromotedName a -> m (MaybePromotedName b) #

sequence :: Monad m => MaybePromotedName (m a) -> m (MaybePromotedName a) #

Traversable Promoted 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> Promoted a -> f (Promoted b) #

sequenceA :: Applicative f => Promoted (f a) -> f (Promoted a) #

mapM :: Monad m => (a -> m b) -> Promoted a -> m (Promoted b) #

sequence :: Monad m => Promoted (m a) -> m (Promoted a) #

Traversable TyVarBind 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> TyVarBind a -> f (TyVarBind b) #

sequenceA :: Applicative f => TyVarBind (f a) -> f (TyVarBind a) #

mapM :: Monad m => (a -> m b) -> TyVarBind a -> m (TyVarBind b) #

sequence :: Monad m => TyVarBind (m a) -> m (TyVarBind a) #

Traversable FunDep 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> FunDep a -> f (FunDep b) #

sequenceA :: Applicative f => FunDep (f a) -> f (FunDep a) #

mapM :: Monad m => (a -> m b) -> FunDep a -> m (FunDep b) #

sequence :: Monad m => FunDep (m a) -> m (FunDep a) #

Traversable Context 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> Context a -> f (Context b) #

sequenceA :: Applicative f => Context (f a) -> f (Context a) #

mapM :: Monad m => (a -> m b) -> Context a -> m (Context b) #

sequence :: Monad m => Context (m a) -> m (Context a) #

Traversable Asst 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> Asst a -> f (Asst b) #

sequenceA :: Applicative f => Asst (f a) -> f (Asst a) #

mapM :: Monad m => (a -> m b) -> Asst a -> m (Asst b) #

sequence :: Monad m => Asst (m a) -> m (Asst a) #

Traversable Literal 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> Literal a -> f (Literal b) #

sequenceA :: Applicative f => Literal (f a) -> f (Literal a) #

mapM :: Monad m => (a -> m b) -> Literal a -> m (Literal b) #

sequence :: Monad m => Literal (m a) -> m (Literal a) #

Traversable Sign 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> Sign a -> f (Sign b) #

sequenceA :: Applicative f => Sign (f a) -> f (Sign a) #

mapM :: Monad m => (a -> m b) -> Sign a -> m (Sign b) #

sequence :: Monad m => Sign (m a) -> m (Sign a) #

Traversable Exp 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> Exp a -> f (Exp b) #

sequenceA :: Applicative f => Exp (f a) -> f (Exp a) #

mapM :: Monad m => (a -> m b) -> Exp a -> m (Exp b) #

sequence :: Monad m => Exp (m a) -> m (Exp a) #

Traversable XName 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> XName a -> f (XName b) #

sequenceA :: Applicative f => XName (f a) -> f (XName a) #

mapM :: Monad m => (a -> m b) -> XName a -> m (XName b) #

sequence :: Monad m => XName (m a) -> m (XName a) #

Traversable XAttr 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> XAttr a -> f (XAttr b) #

sequenceA :: Applicative f => XAttr (f a) -> f (XAttr a) #

mapM :: Monad m => (a -> m b) -> XAttr a -> m (XAttr b) #

sequence :: Monad m => XAttr (m a) -> m (XAttr a) #

Traversable Bracket 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> Bracket a -> f (Bracket b) #

sequenceA :: Applicative f => Bracket (f a) -> f (Bracket a) #

mapM :: Monad m => (a -> m b) -> Bracket a -> m (Bracket b) #

sequence :: Monad m => Bracket (m a) -> m (Bracket a) #

Traversable Splice 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> Splice a -> f (Splice b) #

sequenceA :: Applicative f => Splice (f a) -> f (Splice a) #

mapM :: Monad m => (a -> m b) -> Splice a -> m (Splice b) #

sequence :: Monad m => Splice (m a) -> m (Splice a) #

Traversable Safety 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> Safety a -> f (Safety b) #

sequenceA :: Applicative f => Safety (f a) -> f (Safety a) #

mapM :: Monad m => (a -> m b) -> Safety a -> m (Safety b) #

sequence :: Monad m => Safety (m a) -> m (Safety a) #

Traversable CallConv 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> CallConv a -> f (CallConv b) #

sequenceA :: Applicative f => CallConv (f a) -> f (CallConv a) #

mapM :: Monad m => (a -> m b) -> CallConv a -> m (CallConv b) #

sequence :: Monad m => CallConv (m a) -> m (CallConv a) #

Traversable ModulePragma 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> ModulePragma a -> f (ModulePragma b) #

sequenceA :: Applicative f => ModulePragma (f a) -> f (ModulePragma a) #

mapM :: Monad m => (a -> m b) -> ModulePragma a -> m (ModulePragma b) #

sequence :: Monad m => ModulePragma (m a) -> m (ModulePragma a) #

Traversable Overlap 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> Overlap a -> f (Overlap b) #

sequenceA :: Applicative f => Overlap (f a) -> f (Overlap a) #

mapM :: Monad m => (a -> m b) -> Overlap a -> m (Overlap b) #

sequence :: Monad m => Overlap (m a) -> m (Overlap a) #

Traversable Activation 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> Activation a -> f (Activation b) #

sequenceA :: Applicative f => Activation (f a) -> f (Activation a) #

mapM :: Monad m => (a -> m b) -> Activation a -> m (Activation b) #

sequence :: Monad m => Activation (m a) -> m (Activation a) #

Traversable Rule 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> Rule a -> f (Rule b) #

sequenceA :: Applicative f => Rule (f a) -> f (Rule a) #

mapM :: Monad m => (a -> m b) -> Rule a -> m (Rule b) #

sequence :: Monad m => Rule (m a) -> m (Rule a) #

Traversable RuleVar 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> RuleVar a -> f (RuleVar b) #

sequenceA :: Applicative f => RuleVar (f a) -> f (RuleVar a) #

mapM :: Monad m => (a -> m b) -> RuleVar a -> m (RuleVar b) #

sequence :: Monad m => RuleVar (m a) -> m (RuleVar a) #

Traversable WarningText 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> WarningText a -> f (WarningText b) #

sequenceA :: Applicative f => WarningText (f a) -> f (WarningText a) #

mapM :: Monad m => (a -> m b) -> WarningText a -> m (WarningText b) #

sequence :: Monad m => WarningText (m a) -> m (WarningText a) #

Traversable Pat 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> Pat a -> f (Pat b) #

sequenceA :: Applicative f => Pat (f a) -> f (Pat a) #

mapM :: Monad m => (a -> m b) -> Pat a -> m (Pat b) #

sequence :: Monad m => Pat (m a) -> m (Pat a) #

Traversable PXAttr 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> PXAttr a -> f (PXAttr b) #

sequenceA :: Applicative f => PXAttr (f a) -> f (PXAttr a) #

mapM :: Monad m => (a -> m b) -> PXAttr a -> m (PXAttr b) #

sequence :: Monad m => PXAttr (m a) -> m (PXAttr a) #

Traversable RPatOp 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> RPatOp a -> f (RPatOp b) #

sequenceA :: Applicative f => RPatOp (f a) -> f (RPatOp a) #

mapM :: Monad m => (a -> m b) -> RPatOp a -> m (RPatOp b) #

sequence :: Monad m => RPatOp (m a) -> m (RPatOp a) #

Traversable RPat 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> RPat a -> f (RPat b) #

sequenceA :: Applicative f => RPat (f a) -> f (RPat a) #

mapM :: Monad m => (a -> m b) -> RPat a -> m (RPat b) #

sequence :: Monad m => RPat (m a) -> m (RPat a) #

Traversable PatField 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> PatField a -> f (PatField b) #

sequenceA :: Applicative f => PatField (f a) -> f (PatField a) #

mapM :: Monad m => (a -> m b) -> PatField a -> m (PatField b) #

sequence :: Monad m => PatField (m a) -> m (PatField a) #

Traversable Stmt 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> Stmt a -> f (Stmt b) #

sequenceA :: Applicative f => Stmt (f a) -> f (Stmt a) #

mapM :: Monad m => (a -> m b) -> Stmt a -> m (Stmt b) #

sequence :: Monad m => Stmt (m a) -> m (Stmt a) #

Traversable QualStmt 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> QualStmt a -> f (QualStmt b) #

sequenceA :: Applicative f => QualStmt (f a) -> f (QualStmt a) #

mapM :: Monad m => (a -> m b) -> QualStmt a -> m (QualStmt b) #

sequence :: Monad m => QualStmt (m a) -> m (QualStmt a) #

Traversable FieldUpdate 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> FieldUpdate a -> f (FieldUpdate b) #

sequenceA :: Applicative f => FieldUpdate (f a) -> f (FieldUpdate a) #

mapM :: Monad m => (a -> m b) -> FieldUpdate a -> m (FieldUpdate b) #

sequence :: Monad m => FieldUpdate (m a) -> m (FieldUpdate a) #

Traversable Alt 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> Alt a -> f (Alt b) #

sequenceA :: Applicative f => Alt (f a) -> f (Alt a) #

mapM :: Monad m => (a -> m b) -> Alt a -> m (Alt b) #

sequence :: Monad m => Alt (m a) -> m (Alt a) #

Traversable Vector 
Instance details

Defined in Data.Vector

Methods

traverse :: Applicative f => (a -> f b) -> Vector a -> f (Vector b) #

sequenceA :: Applicative f => Vector (f a) -> f (Vector a) #

mapM :: Monad m => (a -> m b) -> Vector a -> m (Vector b) #

sequence :: Monad m => Vector (m a) -> m (Vector a) #

Traversable SmallArray 
Instance details

Defined in Data.Primitive.SmallArray

Methods

traverse :: Applicative f => (a -> f b) -> SmallArray a -> f (SmallArray b) #

sequenceA :: Applicative f => SmallArray (f a) -> f (SmallArray a) #

mapM :: Monad m => (a -> m b) -> SmallArray a -> m (SmallArray b) #

sequence :: Monad m => SmallArray (m a) -> m (SmallArray a) #

Traversable Array 
Instance details

Defined in Data.Primitive.Array

Methods

traverse :: Applicative f => (a -> f b) -> Array a -> f (Array b) #

sequenceA :: Applicative f => Array (f a) -> f (Array a) #

mapM :: Monad m => (a -> m b) -> Array a -> m (Array b) #

sequence :: Monad m => Array (m a) -> m (Array a) #

Traversable Identity 
Instance details

Defined in Data.Vinyl.Functor

Methods

traverse :: Applicative f => (a -> f b) -> Identity a -> f (Identity b) #

sequenceA :: Applicative f => Identity (f a) -> f (Identity a) #

mapM :: Monad m => (a -> m b) -> Identity a -> m (Identity b) #

sequence :: Monad m => Identity (m a) -> m (Identity a) #

Traversable Thunk 
Instance details

Defined in Data.Vinyl.Functor

Methods

traverse :: Applicative f => (a -> f b) -> Thunk a -> f (Thunk b) #

sequenceA :: Applicative f => Thunk (f a) -> f (Thunk a) #

mapM :: Monad m => (a -> m b) -> Thunk a -> m (Thunk b) #

sequence :: Monad m => Thunk (m a) -> m (Thunk a) #

Traversable (Either a)

Since: base-4.7.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a0 -> f b) -> Either a a0 -> f (Either a b) #

sequenceA :: Applicative f => Either a (f a0) -> f (Either a a0) #

mapM :: Monad m => (a0 -> m b) -> Either a a0 -> m (Either a b) #

sequence :: Monad m => Either a (m a0) -> m (Either a a0) #

Traversable (V1 :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> V1 a -> f (V1 b) #

sequenceA :: Applicative f => V1 (f a) -> f (V1 a) #

mapM :: Monad m => (a -> m b) -> V1 a -> m (V1 b) #

sequence :: Monad m => V1 (m a) -> m (V1 a) #

Traversable (U1 :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> U1 a -> f (U1 b) #

sequenceA :: Applicative f => U1 (f a) -> f (U1 a) #

mapM :: Monad m => (a -> m b) -> U1 a -> m (U1 b) #

sequence :: Monad m => U1 (m a) -> m (U1 a) #

Traversable ((,) a)

Since: base-4.7.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a0 -> f b) -> (a, a0) -> f (a, b) #

sequenceA :: Applicative f => (a, f a0) -> f (a, a0) #

mapM :: Monad m => (a0 -> m b) -> (a, a0) -> m (a, b) #

sequence :: Monad m => (a, m a0) -> m (a, a0) #

Traversable (HashMap k) 
Instance details

Defined in Data.HashMap.Base

Methods

traverse :: Applicative f => (a -> f b) -> HashMap k a -> f (HashMap k b) #

sequenceA :: Applicative f => HashMap k (f a) -> f (HashMap k a) #

mapM :: Monad m => (a -> m b) -> HashMap k a -> m (HashMap k b) #

sequence :: Monad m => HashMap k (m a) -> m (HashMap k a) #

Traversable (Map k)

Traverses in order of increasing key.

Instance details

Defined in Data.Map.Internal

Methods

traverse :: Applicative f => (a -> f b) -> Map k a -> f (Map k b) #

sequenceA :: Applicative f => Map k (f a) -> f (Map k a) #

mapM :: Monad m => (a -> m b) -> Map k a -> m (Map k b) #

sequence :: Monad m => Map k (m a) -> m (Map k a) #

Ix i => Traversable (Array i)

Since: base-2.1

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> Array i a -> f (Array i b) #

sequenceA :: Applicative f => Array i (f a) -> f (Array i a) #

mapM :: Monad m => (a -> m b) -> Array i a -> m (Array i b) #

sequence :: Monad m => Array i (m a) -> m (Array i a) #

Traversable (Arg a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

traverse :: Applicative f => (a0 -> f b) -> Arg a a0 -> f (Arg a b) #

sequenceA :: Applicative f => Arg a (f a0) -> f (Arg a a0) #

mapM :: Monad m => (a0 -> m b) -> Arg a a0 -> m (Arg a b) #

sequence :: Monad m => Arg a (m a0) -> m (Arg a a0) #

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) #

Traversable f => Traversable (MaybeT f) 
Instance details

Defined in Control.Monad.Trans.Maybe

Methods

traverse :: Applicative f0 => (a -> f0 b) -> MaybeT f a -> f0 (MaybeT f b) #

sequenceA :: Applicative f0 => MaybeT f (f0 a) -> f0 (MaybeT f a) #

mapM :: Monad m => (a -> m b) -> MaybeT f a -> m (MaybeT f b) #

sequence :: Monad m => MaybeT f (m a) -> m (MaybeT f a) #

Traversable f => Traversable (Cofree f) 
Instance details

Defined in Control.Comonad.Cofree

Methods

traverse :: Applicative f0 => (a -> f0 b) -> Cofree f a -> f0 (Cofree f b) #

sequenceA :: Applicative f0 => Cofree f (f0 a) -> f0 (Cofree f a) #

mapM :: Monad m => (a -> m b) -> Cofree f a -> m (Cofree f b) #

sequence :: Monad m => Cofree f (m a) -> m (Cofree f a) #

Traversable f => Traversable (Free f) 
Instance details

Defined in Control.Monad.Free

Methods

traverse :: Applicative f0 => (a -> f0 b) -> Free f a -> f0 (Free f b) #

sequenceA :: Applicative f0 => Free f (f0 a) -> f0 (Free f a) #

mapM :: Monad m => (a -> m b) -> Free f a -> m (Free f b) #

sequence :: Monad m => Free f (m a) -> m (Free f a) #

Traversable f => Traversable (Yoneda f) 
Instance details

Defined in Data.Functor.Yoneda

Methods

traverse :: Applicative f0 => (a -> f0 b) -> Yoneda f a -> f0 (Yoneda f b) #

sequenceA :: Applicative f0 => Yoneda f (f0 a) -> f0 (Yoneda f a) #

mapM :: Monad m => (a -> m b) -> Yoneda f a -> m (Yoneda f b) #

sequence :: Monad m => Yoneda f (m a) -> m (Yoneda f a) #

Traversable f => Traversable (Rec1 f)

Since: base-4.9.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f0 => (a -> f0 b) -> Rec1 f a -> f0 (Rec1 f b) #

sequenceA :: Applicative f0 => Rec1 f (f0 a) -> f0 (Rec1 f a) #

mapM :: Monad m => (a -> m b) -> Rec1 f a -> m (Rec1 f b) #

sequence :: Monad m => Rec1 f (m a) -> m (Rec1 f a) #

Traversable (URec Char :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> URec Char a -> f (URec Char b) #

sequenceA :: Applicative f => URec Char (f a) -> f (URec Char a) #

mapM :: Monad m => (a -> m b) -> URec Char a -> m (URec Char b) #

sequence :: Monad m => URec Char (m a) -> m (URec Char a) #

Traversable (URec Double :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> URec Double a -> f (URec Double b) #

sequenceA :: Applicative f => URec Double (f a) -> f (URec Double a) #

mapM :: Monad m => (a -> m b) -> URec Double a -> m (URec Double b) #

sequence :: Monad m => URec Double (m a) -> m (URec Double a) #

Traversable (URec Float :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> URec Float a -> f (URec Float b) #

sequenceA :: Applicative f => URec Float (f a) -> f (URec Float a) #

mapM :: Monad m => (a -> m b) -> URec Float a -> m (URec Float b) #

sequence :: Monad m => URec Float (m a) -> m (URec Float 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) #

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) #

Traversable (URec (Ptr ()) :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> URec (Ptr ()) a -> f (URec (Ptr ()) b) #

sequenceA :: Applicative f => URec (Ptr ()) (f a) -> f (URec (Ptr ()) a) #

mapM :: Monad m => (a -> m b) -> URec (Ptr ()) a -> m (URec (Ptr ()) b) #

sequence :: Monad m => URec (Ptr ()) (m a) -> m (URec (Ptr ()) a) #

Traversable (Const m :: Type -> Type)

Since: base-4.7.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> Const m a -> f (Const m b) #

sequenceA :: Applicative f => Const m (f a) -> f (Const m a) #

mapM :: Monad m0 => (a -> m0 b) -> Const m a -> m0 (Const m b) #

sequence :: Monad m0 => Const m (m0 a) -> m0 (Const m 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) #

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) #

Bitraversable p => Traversable (Join p) 
Instance details

Defined in Data.Bifunctor.Join

Methods

traverse :: Applicative f => (a -> f b) -> Join p a -> f (Join p b) #

sequenceA :: Applicative f => Join p (f a) -> f (Join p a) #

mapM :: Monad m => (a -> m b) -> Join p a -> m (Join p b) #

sequence :: Monad m => Join p (m a) -> m (Join p a) #

Bitraversable p => Traversable (Fix p) 
Instance details

Defined in Data.Bifunctor.Fix

Methods

traverse :: Applicative f => (a -> f b) -> Fix p a -> f (Fix p b) #

sequenceA :: Applicative f => Fix p (f a) -> f (Fix p a) #

mapM :: Monad m => (a -> m b) -> Fix p a -> m (Fix p b) #

sequence :: Monad m => Fix p (m a) -> m (Fix p a) #

Traversable f => Traversable (IdentityT f) 
Instance details

Defined in Control.Monad.Trans.Identity

Methods

traverse :: Applicative f0 => (a -> f0 b) -> IdentityT f a -> f0 (IdentityT f b) #

sequenceA :: Applicative f0 => IdentityT f (f0 a) -> f0 (IdentityT f a) #

mapM :: Monad m => (a -> m b) -> IdentityT f a -> m (IdentityT f b) #

sequence :: Monad m => IdentityT f (m a) -> m (IdentityT f a) #

Traversable f => Traversable (ExceptT e f) 
Instance details

Defined in Control.Monad.Trans.Except

Methods

traverse :: Applicative f0 => (a -> f0 b) -> ExceptT e f a -> f0 (ExceptT e f b) #

sequenceA :: Applicative f0 => ExceptT e f (f0 a) -> f0 (ExceptT e f a) #

mapM :: Monad m => (a -> m b) -> ExceptT e f a -> m (ExceptT e f b) #

sequence :: Monad m => ExceptT e f (m a) -> m (ExceptT e f a) #

Traversable f => Traversable (FreeF f a) 
Instance details

Defined in Control.Monad.Trans.Free

Methods

traverse :: Applicative f0 => (a0 -> f0 b) -> FreeF f a a0 -> f0 (FreeF f a b) #

sequenceA :: Applicative f0 => FreeF f a (f0 a0) -> f0 (FreeF f a a0) #

mapM :: Monad m => (a0 -> m b) -> FreeF f a a0 -> m (FreeF f a b) #

sequence :: Monad m => FreeF f a (m a0) -> m (FreeF f a a0) #

(Monad m, Traversable m, Traversable f) => Traversable (FreeT f m) 
Instance details

Defined in Control.Monad.Trans.Free

Methods

traverse :: Applicative f0 => (a -> f0 b) -> FreeT f m a -> f0 (FreeT f m b) #

sequenceA :: Applicative f0 => FreeT f m (f0 a) -> f0 (FreeT f m a) #

mapM :: Monad m0 => (a -> m0 b) -> FreeT f m a -> m0 (FreeT f m b) #

sequence :: Monad m0 => FreeT f m (m0 a) -> m0 (FreeT f m a) #

Traversable f => Traversable (CofreeF f a) 
Instance details

Defined in Control.Comonad.Trans.Cofree

Methods

traverse :: Applicative f0 => (a0 -> f0 b) -> CofreeF f a a0 -> f0 (CofreeF f a b) #

sequenceA :: Applicative f0 => CofreeF f a (f0 a0) -> f0 (CofreeF f a a0) #

mapM :: Monad m => (a0 -> m b) -> CofreeF f a a0 -> m (CofreeF f a b) #

sequence :: Monad m => CofreeF f a (m a0) -> m (CofreeF f a a0) #

(Traversable f, Traversable w) => Traversable (CofreeT f w) 
Instance details

Defined in Control.Comonad.Trans.Cofree

Methods

traverse :: Applicative f0 => (a -> f0 b) -> CofreeT f w a -> f0 (CofreeT f w b) #

sequenceA :: Applicative f0 => CofreeT f w (f0 a) -> f0 (CofreeT f w a) #

mapM :: Monad m => (a -> m b) -> CofreeT f w a -> m (CofreeT f w b) #

sequence :: Monad m => CofreeT f w (m a) -> m (CofreeT f w a) #

Traversable f => Traversable (ErrorT e f) 
Instance details

Defined in Control.Monad.Trans.Error

Methods

traverse :: Applicative f0 => (a -> f0 b) -> ErrorT e f a -> f0 (ErrorT e f b) #

sequenceA :: Applicative f0 => ErrorT e f (f0 a) -> f0 (ErrorT e f a) #

mapM :: Monad m => (a -> m b) -> ErrorT e f a -> m (ErrorT e f b) #

sequence :: Monad m => ErrorT e f (m a) -> m (ErrorT e f 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) #

Traversable (Const a :: Type -> Type) 
Instance details

Defined in Data.Vinyl.Functor

Methods

traverse :: Applicative f => (a0 -> f b) -> Const a a0 -> f (Const a b) #

sequenceA :: Applicative f => Const a (f a0) -> f (Const a a0) #

mapM :: Monad m => (a0 -> m b) -> Const a a0 -> m (Const a b) #

sequence :: Monad m => Const a (m a0) -> m (Const a a0) #

Traversable (K1 i c :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> K1 i c a -> f (K1 i c b) #

sequenceA :: Applicative f => K1 i c (f a) -> f (K1 i c a) #

mapM :: Monad m => (a -> m b) -> K1 i c a -> m (K1 i c b) #

sequence :: Monad m => K1 i c (m a) -> m (K1 i c a) #

(Traversable f, Traversable g) => Traversable (f :+: g)

Since: base-4.9.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f0 => (a -> f0 b) -> (f :+: g) a -> f0 ((f :+: g) b) #

sequenceA :: Applicative f0 => (f :+: g) (f0 a) -> f0 ((f :+: g) a) #

mapM :: Monad m => (a -> m b) -> (f :+: g) a -> m ((f :+: g) b) #

sequence :: Monad m => (f :+: g) (m a) -> m ((f :+: g) a) #

(Traversable f, Traversable g) => Traversable (f :*: g)

Since: base-4.9.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f0 => (a -> f0 b) -> (f :*: g) a -> f0 ((f :*: g) b) #

sequenceA :: Applicative f0 => (f :*: g) (f0 a) -> f0 ((f :*: g) a) #

mapM :: Monad m => (a -> m b) -> (f :*: g) a -> m ((f :*: g) b) #

sequence :: Monad m => (f :*: g) (m a) -> m ((f :*: g) a) #

(Traversable f, Traversable g) => Traversable (Product f g)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Product

Methods

traverse :: Applicative f0 => (a -> f0 b) -> Product f g a -> f0 (Product f g b) #

sequenceA :: Applicative f0 => Product f g (f0 a) -> f0 (Product f g a) #

mapM :: Monad m => (a -> m b) -> Product f g a -> m (Product f g b) #

sequence :: Monad m => Product f g (m a) -> m (Product f g a) #

(Traversable f, Traversable g) => Traversable (Sum f g)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Sum

Methods

traverse :: Applicative f0 => (a -> f0 b) -> Sum f g a -> f0 (Sum f g b) #

sequenceA :: Applicative f0 => Sum f g (f0 a) -> f0 (Sum f g a) #

mapM :: Monad m => (a -> m b) -> Sum f g a -> m (Sum f g b) #

sequence :: Monad m => Sum f g (m a) -> m (Sum f g a) #

Traversable f => Traversable (M1 i c f)

Since: base-4.9.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f0 => (a -> f0 b) -> M1 i c f a -> f0 (M1 i c f b) #

sequenceA :: Applicative f0 => M1 i c f (f0 a) -> f0 (M1 i c f a) #

mapM :: Monad m => (a -> m b) -> M1 i c f a -> m (M1 i c f b) #

sequence :: Monad m => M1 i c f (m a) -> m (M1 i c f a) #

(Traversable f, Traversable g) => Traversable (f :.: g)

Since: base-4.9.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f0 => (a -> f0 b) -> (f :.: g) a -> f0 ((f :.: g) b) #

sequenceA :: Applicative f0 => (f :.: g) (f0 a) -> f0 ((f :.: g) a) #

mapM :: Monad m => (a -> m b) -> (f :.: g) a -> m ((f :.: g) b) #

sequence :: Monad m => (f :.: g) (m a) -> m ((f :.: g) a) #

(Traversable f, Traversable g) => Traversable (Compose f g)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Compose

Methods

traverse :: Applicative f0 => (a -> f0 b) -> Compose f g a -> f0 (Compose f g b) #

sequenceA :: Applicative f0 => Compose f g (f0 a) -> f0 (Compose f g a) #

mapM :: Monad m => (a -> m b) -> Compose f g a -> m (Compose f g b) #

sequence :: Monad m => Compose f g (m a) -> m (Compose f g a) #

Bitraversable p => Traversable (WrappedBifunctor p a) 
Instance details

Defined in Data.Bifunctor.Wrapped

Methods

traverse :: Applicative f => (a0 -> f b) -> WrappedBifunctor p a a0 -> f (WrappedBifunctor p a b) #

sequenceA :: Applicative f => WrappedBifunctor p a (f a0) -> f (WrappedBifunctor p a a0) #

mapM :: Monad m => (a0 -> m b) -> WrappedBifunctor p a a0 -> m (WrappedBifunctor p a b) #

sequence :: Monad m => WrappedBifunctor p a (m a0) -> m (WrappedBifunctor p a a0) #

Traversable g => Traversable (Joker g a) 
Instance details

Defined in Data.Bifunctor.Joker

Methods

traverse :: Applicative f => (a0 -> f b) -> Joker g a a0 -> f (Joker g a b) #

sequenceA :: Applicative f => Joker g a (f a0) -> f (Joker g a a0) #

mapM :: Monad m => (a0 -> m b) -> Joker g a a0 -> m (Joker g a b) #

sequence :: Monad m => Joker g a (m a0) -> m (Joker g a a0) #

Bitraversable p => Traversable (Flip p a) 
Instance details

Defined in Data.Bifunctor.Flip

Methods

traverse :: Applicative f => (a0 -> f b) -> Flip p a a0 -> f (Flip p a b) #

sequenceA :: Applicative f => Flip p a (f a0) -> f (Flip p a a0) #

mapM :: Monad m => (a0 -> m b) -> Flip p a a0 -> m (Flip p a b) #

sequence :: Monad m => Flip p a (m a0) -> m (Flip p a a0) #

Traversable (Clown f a :: Type -> Type) 
Instance details

Defined in Data.Bifunctor.Clown

Methods

traverse :: Applicative f0 => (a0 -> f0 b) -> Clown f a a0 -> f0 (Clown f a b) #

sequenceA :: Applicative f0 => Clown f a (f0 a0) -> f0 (Clown f a a0) #

mapM :: Monad m => (a0 -> m b) -> Clown f a a0 -> m (Clown f a b) #

sequence :: Monad m => Clown f a (m a0) -> m (Clown f a a0) #

(Traversable f, Traversable g) => Traversable (Compose f g) 
Instance details

Defined in Data.Vinyl.Functor

Methods

traverse :: Applicative f0 => (a -> f0 b) -> Compose f g a -> f0 (Compose f g b) #

sequenceA :: Applicative f0 => Compose f g (f0 a) -> f0 (Compose f g a) #

mapM :: Monad m => (a -> m b) -> Compose f g a -> m (Compose f g b) #

sequence :: Monad m => Compose f g (m a) -> m (Compose f g a) #

(Traversable f, Bitraversable p) => Traversable (Tannen f p a) 
Instance details

Defined in Data.Bifunctor.Tannen

Methods

traverse :: Applicative f0 => (a0 -> f0 b) -> Tannen f p a a0 -> f0 (Tannen f p a b) #

sequenceA :: Applicative f0 => Tannen f p a (f0 a0) -> f0 (Tannen f p a a0) #

mapM :: Monad m => (a0 -> m b) -> Tannen f p a a0 -> m (Tannen f p a b) #

sequence :: Monad m => Tannen f p a (m a0) -> m (Tannen f p a a0) #

(Bitraversable p, Traversable g) => Traversable (Biff p f g a) 
Instance details

Defined in Data.Bifunctor.Biff

Methods

traverse :: Applicative f0 => (a0 -> f0 b) -> Biff p f g a a0 -> f0 (Biff p f g a b) #

sequenceA :: Applicative f0 => Biff p f g a (f0 a0) -> f0 (Biff p f g a a0) #

mapM :: Monad m => (a0 -> m b) -> Biff p f g a a0 -> m (Biff p f g a b) #

sequence :: Monad m => Biff p f g a (m a0) -> m (Biff p f g a a0) #

class Generic a #

Representable types of kind *. This class is derivable in GHC with the DeriveGeneric flag on.

A Generic instance must satisfy the following laws:

from . toid
to . fromid

Minimal complete definition

from, to

Instances

Instances details
Generic Bool

Since: base-4.6.0.0

Instance details

Defined in GHC.Generics

Associated Types

type Rep Bool :: Type -> Type #

Methods

from :: Bool -> Rep Bool x #

to :: Rep Bool x -> Bool #

Generic Ordering

Since: base-4.6.0.0

Instance details

Defined in GHC.Generics

Associated Types

type Rep Ordering :: Type -> Type #

Methods

from :: Ordering -> Rep Ordering x #

to :: Rep Ordering x -> Ordering #

Generic Exp 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Exp :: Type -> Type #

Methods

from :: Exp -> Rep Exp x #

to :: Rep Exp x -> Exp #

Generic Match 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Match :: Type -> Type #

Methods

from :: Match -> Rep Match x #

to :: Rep Match x -> Match #

Generic Clause 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Clause :: Type -> Type #

Methods

from :: Clause -> Rep Clause x #

to :: Rep Clause x -> Clause #

Generic Pat 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Pat :: Type -> Type #

Methods

from :: Pat -> Rep Pat x #

to :: Rep Pat x -> Pat #

Generic Type 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Type :: Type -> Type #

Methods

from :: Type -> Rep Type x #

to :: Rep Type x -> Type #

Generic Dec 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Dec :: Type -> Type #

Methods

from :: Dec -> Rep Dec x #

to :: Rep Dec x -> Dec #

Generic Name 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Name :: Type -> Type #

Methods

from :: Name -> Rep Name x #

to :: Rep Name x -> Name #

Generic FunDep 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep FunDep :: Type -> Type #

Methods

from :: FunDep -> Rep FunDep x #

to :: Rep FunDep x -> FunDep #

Generic InjectivityAnn 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep InjectivityAnn :: Type -> Type #

Generic Overlap 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Overlap :: Type -> Type #

Methods

from :: Overlap -> Rep Overlap x #

to :: Rep Overlap x -> Overlap #

Generic ()

Since: base-4.6.0.0

Instance details

Defined in GHC.Generics

Associated Types

type Rep () :: Type -> Type #

Methods

from :: () -> Rep () x #

to :: Rep () x -> () #

Generic Version

Since: base-4.9.0.0

Instance details

Defined in Data.Version

Associated Types

type Rep Version :: Type -> Type #

Methods

from :: Version -> Rep Version x #

to :: Rep Version x -> Version #

Generic Con 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Con :: Type -> Type #

Methods

from :: Con -> Rep Con x #

to :: Rep Con x -> Con #

Generic Value 
Instance details

Defined in Data.Aeson.Types.Internal

Associated Types

type Rep Value :: Type -> Type #

Methods

from :: Value -> Rep Value x #

to :: Rep Value x -> Value #

Generic Void

Since: base-4.8.0.0

Instance details

Defined in Data.Void

Associated Types

type Rep Void :: Type -> Type #

Methods

from :: Void -> Rep Void x #

to :: Rep Void x -> Void #

Generic ExitCode 
Instance details

Defined in GHC.IO.Exception

Associated Types

type Rep ExitCode :: Type -> Type #

Methods

from :: ExitCode -> Rep ExitCode x #

to :: Rep ExitCode x -> ExitCode #

Generic All

Since: base-4.7.0.0

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 #

Generic Any

Since: base-4.7.0.0

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 #

Generic Fixity

Since: base-4.7.0.0

Instance details

Defined in GHC.Generics

Associated Types

type Rep Fixity :: Type -> Type #

Methods

from :: Fixity -> Rep Fixity x #

to :: Rep Fixity x -> Fixity #

Generic Associativity

Since: base-4.7.0.0

Instance details

Defined in GHC.Generics

Associated Types

type Rep Associativity :: Type -> Type #

Generic SourceUnpackedness

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Associated Types

type Rep SourceUnpackedness :: Type -> Type #

Generic SourceStrictness

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Associated Types

type Rep SourceStrictness :: Type -> Type #

Generic DecidedStrictness

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Associated Types

type Rep DecidedStrictness :: Type -> Type #

Generic Alphabet 
Instance details

Defined in Data.ByteString.Base58.Internal

Associated Types

type Rep Alphabet :: Type -> Type #

Methods

from :: Alphabet -> Rep Alphabet x #

to :: Rep Alphabet x -> Alphabet #

Generic Extension 
Instance details

Defined in GHC.LanguageExtensions.Type

Associated Types

type Rep Extension :: Type -> Type #

Generic ForeignSrcLang 
Instance details

Defined in GHC.ForeignSrcLang.Type

Associated Types

type Rep ForeignSrcLang :: Type -> Type #

Generic Boxed 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep Boxed :: Type -> Type #

Methods

from :: Boxed -> Rep Boxed x #

to :: Rep Boxed x -> Boxed #

Generic Tool 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep Tool :: Type -> Type #

Methods

from :: Tool -> Rep Tool x #

to :: Rep Tool x -> Tool #

Generic SrcLoc 
Instance details

Defined in Language.Haskell.Exts.SrcLoc

Associated Types

type Rep SrcLoc :: Type -> Type #

Methods

from :: SrcLoc -> Rep SrcLoc x #

to :: Rep SrcLoc x -> SrcLoc #

Generic SrcSpan 
Instance details

Defined in Language.Haskell.Exts.SrcLoc

Associated Types

type Rep SrcSpan :: Type -> Type #

Methods

from :: SrcSpan -> Rep SrcSpan x #

to :: Rep SrcSpan x -> SrcSpan #

Generic SrcSpanInfo 
Instance details

Defined in Language.Haskell.Exts.SrcLoc

Associated Types

type Rep SrcSpanInfo :: Type -> Type #

Generic Mode 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Associated Types

type Rep Mode :: Type -> Type #

Methods

from :: Mode -> Rep Mode x #

to :: Rep Mode x -> Mode #

Generic Style 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Associated Types

type Rep Style :: Type -> Type #

Methods

from :: Style -> Rep Style x #

to :: Rep Style x -> Style #

Generic AnnLookup 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep AnnLookup :: Type -> Type #

Generic Role 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Role :: Type -> Type #

Methods

from :: Role -> Rep Role x #

to :: Rep Role x -> Role #

Generic TyLit 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep TyLit :: Type -> Type #

Methods

from :: TyLit -> Rep TyLit x #

to :: Rep TyLit x -> TyLit #

Generic FamilyResultSig 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep FamilyResultSig :: Type -> Type #

Generic TyVarBndr 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep TyVarBndr :: Type -> Type #

Generic PatSynArgs 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep PatSynArgs :: Type -> Type #

Generic PatSynDir 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep PatSynDir :: Type -> Type #

Generic Bang 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Bang :: Type -> Type #

Methods

from :: Bang -> Rep Bang x #

to :: Rep Bang x -> Bang #

Generic DecidedStrictness 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep DecidedStrictness :: Type -> Type #

Generic SourceStrictness 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep SourceStrictness :: Type -> Type #

Generic SourceUnpackedness 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep SourceUnpackedness :: Type -> Type #

Generic AnnTarget 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep AnnTarget :: Type -> Type #

Generic RuleBndr 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep RuleBndr :: Type -> Type #

Methods

from :: RuleBndr -> Rep RuleBndr x #

to :: Rep RuleBndr x -> RuleBndr #

Generic Phases 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Phases :: Type -> Type #

Methods

from :: Phases -> Rep Phases x #

to :: Rep Phases x -> Phases #

Generic RuleMatch 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep RuleMatch :: Type -> Type #

Generic Inline 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Inline :: Type -> Type #

Methods

from :: Inline -> Rep Inline x #

to :: Rep Inline x -> Inline #

Generic Pragma 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Pragma :: Type -> Type #

Methods

from :: Pragma -> Rep Pragma x #

to :: Rep Pragma x -> Pragma #

Generic Safety 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Safety :: Type -> Type #

Methods

from :: Safety -> Rep Safety x #

to :: Rep Safety x -> Safety #

Generic Callconv 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Callconv :: Type -> Type #

Methods

from :: Callconv -> Rep Callconv x #

to :: Rep Callconv x -> Callconv #

Generic Foreign 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Foreign :: Type -> Type #

Methods

from :: Foreign -> Rep Foreign x #

to :: Rep Foreign x -> Foreign #

Generic TySynEqn 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep TySynEqn :: Type -> Type #

Methods

from :: TySynEqn -> Rep TySynEqn x #

to :: Rep TySynEqn x -> TySynEqn #

Generic TypeFamilyHead 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep TypeFamilyHead :: Type -> Type #

Generic DerivStrategy 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep DerivStrategy :: Type -> Type #

Generic DerivClause 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep DerivClause :: Type -> Type #

Generic Range 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Range :: Type -> Type #

Methods

from :: Range -> Rep Range x #

to :: Rep Range x -> Range #

Generic Stmt 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Stmt :: Type -> Type #

Methods

from :: Stmt -> Rep Stmt x #

to :: Rep Stmt x -> Stmt #

Generic Guard 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Guard :: Type -> Type #

Methods

from :: Guard -> Rep Guard x #

to :: Rep Guard x -> Guard #

Generic Body 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Body :: Type -> Type #

Methods

from :: Body -> Rep Body x #

to :: Rep Body x -> Body #

Generic Lit 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Lit :: Type -> Type #

Methods

from :: Lit -> Rep Lit x #

to :: Rep Lit x -> Lit #

Generic FixityDirection 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep FixityDirection :: Type -> Type #

Generic Fixity 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Fixity :: Type -> Type #

Methods

from :: Fixity -> Rep Fixity x #

to :: Rep Fixity x -> Fixity #

Generic ModuleInfo 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep ModuleInfo :: Type -> Type #

Generic Info 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Info :: Type -> Type #

Methods

from :: Info -> Rep Info x #

to :: Rep Info x -> Info #

Generic Loc 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Loc :: Type -> Type #

Methods

from :: Loc -> Rep Loc x #

to :: Rep Loc x -> Loc #

Generic NameSpace 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep NameSpace :: Type -> Type #

Generic MyStoreTemplateBig 
Instance details

Defined in Lorentz.UStore.Instr

Associated Types

type Rep MyStoreTemplateBig :: Type -> Type #

Methods

from :: MyStoreTemplateBig -> Rep MyStoreTemplateBig x #

to :: Rep MyStoreTemplateBig x -> MyStoreTemplateBig #

Generic MyStoreTemplate 
Instance details

Defined in Lorentz.UStore.Instr

Associated Types

type Rep MyStoreTemplate :: Type -> Type #

Methods

from :: MyStoreTemplate -> Rep MyStoreTemplate x #

to :: Rep MyStoreTemplate x -> MyStoreTemplate #

Generic T 
Instance details

Defined in Michelson.Typed.T

Associated Types

type Rep T :: Type -> Type #

Methods

from :: T -> Rep T x #

to :: Rep T x -> T #

Generic EntryPointLookupError 
Instance details

Defined in Lorentz.UParam

Associated Types

type Rep EntryPointLookupError :: Type -> Type #

Generic UnspecifiedError 
Instance details

Defined in Lorentz.Errors

Associated Types

type Rep UnspecifiedError :: Type -> Type #

Generic EpName 
Instance details

Defined in Michelson.Untyped.EntryPoints

Associated Types

type Rep EpName :: Type -> Type #

Methods

from :: EpName -> Rep EpName x #

to :: Rep EpName x -> EpName #

Generic MText 
Instance details

Defined in Michelson.Text

Associated Types

type Rep MText :: Type -> Type #

Methods

from :: MText -> Rep MText x #

to :: Rep MText x -> MText #

Generic KeyHash 
Instance details

Defined in Tezos.Crypto

Associated Types

type Rep KeyHash :: Type -> Type #

Methods

from :: KeyHash -> Rep KeyHash x #

to :: Rep KeyHash x -> KeyHash #

Generic Signature 
Instance details

Defined in Tezos.Crypto

Associated Types

type Rep Signature :: Type -> Type #

Generic PublicKey 
Instance details

Defined in Tezos.Crypto

Associated Types

type Rep PublicKey :: Type -> Type #

Generic ChainId 
Instance details

Defined in Tezos.Core

Associated Types

type Rep ChainId :: Type -> Type #

Methods

from :: ChainId -> Rep ChainId x #

to :: Rep ChainId x -> ChainId #

Generic Timestamp 
Instance details

Defined in Tezos.Core

Associated Types

type Rep Timestamp :: Type -> Type #

Generic Mutez 
Instance details

Defined in Tezos.Core

Associated Types

type Rep Mutez :: Type -> Type #

Methods

from :: Mutez -> Rep Mutez x #

to :: Rep Mutez x -> Mutez #

Generic Address 
Instance details

Defined in Tezos.Address

Associated Types

type Rep Address :: Type -> Type #

Methods

from :: Address -> Rep Address x #

to :: Rep Address x -> Address #

Generic EpAddress 
Instance details

Defined in Michelson.Typed.EntryPoints

Associated Types

type Rep EpAddress :: Type -> Type #

Generic InvalidPosException 
Instance details

Defined in Text.Megaparsec.Pos

Associated Types

type Rep InvalidPosException :: Type -> Type #

Generic SourcePos 
Instance details

Defined in Text.Megaparsec.Pos

Associated Types

type Rep SourcePos :: Type -> Type #

Generic InterpretError 
Instance details

Defined in Michelson.Interpret

Associated Types

type Rep InterpretError :: Type -> Type #

Generic MorleyLogs 
Instance details

Defined in Michelson.Interpret

Associated Types

type Rep MorleyLogs :: Type -> Type #

Generic RemainingSteps 
Instance details

Defined in Michelson.Interpret

Associated Types

type Rep RemainingSteps :: Type -> Type #

Generic InterpreterState 
Instance details

Defined in Michelson.Interpret

Associated Types

type Rep InterpreterState :: Type -> Type #

Generic LetMacro 
Instance details

Defined in Michelson.Macro

Associated Types

type Rep LetMacro :: Type -> Type #

Methods

from :: LetMacro -> Rep LetMacro x #

to :: Rep LetMacro x -> LetMacro #

Generic PairStruct 
Instance details

Defined in Michelson.Macro

Associated Types

type Rep PairStruct :: Type -> Type #

Generic UnpairStruct 
Instance details

Defined in Michelson.Macro

Associated Types

type Rep UnpairStruct :: Type -> Type #

Generic CadrStruct 
Instance details

Defined in Michelson.Macro

Associated Types

type Rep CadrStruct :: Type -> Type #

Generic ParsedOp 
Instance details

Defined in Michelson.Macro

Associated Types

type Rep ParsedOp :: Type -> Type #

Methods

from :: ParsedOp -> Rep ParsedOp x #

to :: Rep ParsedOp x -> ParsedOp #

Generic Macro 
Instance details

Defined in Michelson.Macro

Associated Types

type Rep Macro :: Type -> Type #

Methods

from :: Macro -> Rep Macro x #

to :: Rep Macro x -> Macro #

Generic ExpectType 
Instance details

Defined in Michelson.TypeCheck.Error

Associated Types

type Rep ExpectType :: Type -> Type #

Generic TypeContext 
Instance details

Defined in Michelson.TypeCheck.Error

Associated Types

type Rep TypeContext :: Type -> Type #

Generic TCTypeError 
Instance details

Defined in Michelson.TypeCheck.Error

Associated Types

type Rep TCTypeError :: Type -> Type #

Generic TCError 
Instance details

Defined in Michelson.TypeCheck.Error

Associated Types

type Rep TCError :: Type -> Type #

Methods

from :: TCError -> Rep TCError x #

to :: Rep TCError x -> TCError #

Generic StackSize 
Instance details

Defined in Michelson.TypeCheck.Error

Associated Types

type Rep StackSize :: Type -> Type #

Generic ExtError 
Instance details

Defined in Michelson.TypeCheck.Error

Associated Types

type Rep ExtError :: Type -> Type #

Methods

from :: ExtError -> Rep ExtError x #

to :: Rep ExtError x -> ExtError #

Generic DStorageType 
Instance details

Defined in Michelson.Typed.Haskell.Doc

Associated Types

type Rep DStorageType :: Type -> Type #

Generic MyCompoundType 
Instance details

Defined in Michelson.Typed.Haskell.Instr.Sum

Associated Types

type Rep MyCompoundType :: Type -> Type #

Generic CommentType 
Instance details

Defined in Michelson.Typed.Instr

Associated Types

type Rep CommentType :: Type -> Type #

Generic ArithErrorType 
Instance details

Defined in Michelson.Typed.Arith

Associated Types

type Rep ArithErrorType :: Type -> Type #

Generic SetDelegate 
Instance details

Defined in Michelson.Typed.Value

Associated Types

type Rep SetDelegate :: Type -> Type #

Generic ParseEpAddressError 
Instance details

Defined in Michelson.Typed.EntryPoints

Associated Types

type Rep ParseEpAddressError :: Type -> Type #

Generic ArmCoord 
Instance details

Defined in Michelson.Typed.EntryPoints

Associated Types

type Rep ArmCoord :: Type -> Type #

Methods

from :: ArmCoord -> Rep ArmCoord x #

to :: Rep ArmCoord x -> ArmCoord #

Generic ParamEpError 
Instance details

Defined in Michelson.Typed.EntryPoints

Associated Types

type Rep ParamEpError :: Type -> Type #

Generic ExpandedOp 
Instance details

Defined in Michelson.Untyped.Instr

Associated Types

type Rep ExpandedOp :: Type -> Type #

Generic OriginationOperation 
Instance details

Defined in Michelson.Untyped.Instr

Associated Types

type Rep OriginationOperation :: Type -> Type #

Generic GlobalCounter 
Instance details

Defined in Michelson.Untyped.Instr

Associated Types

type Rep GlobalCounter :: Type -> Type #

Generic InternalByteString 
Instance details

Defined in Michelson.Untyped.Value

Associated Types

type Rep InternalByteString :: Type -> Type #

Generic ContractHash 
Instance details

Defined in Tezos.Address

Associated Types

type Rep ContractHash :: Type -> Type #

Generic OperationHash 
Instance details

Defined in Tezos.Address

Associated Types

type Rep OperationHash :: Type -> Type #

Generic OriginationIndex 
Instance details

Defined in Tezos.Address

Associated Types

type Rep OriginationIndex :: Type -> Type #

Generic ParseAddressError 
Instance details

Defined in Tezos.Address

Associated Types

type Rep ParseAddressError :: Type -> Type #

Generic ParseAddressRawError 
Instance details

Defined in Tezos.Address

Associated Types

type Rep ParseAddressRawError :: Type -> Type #

Generic ParseContractAddressError 
Instance details

Defined in Tezos.Address

Associated Types

type Rep ParseContractAddressError :: Type -> Type #

Generic SecretKey 
Instance details

Defined in Tezos.Crypto

Associated Types

type Rep SecretKey :: Type -> Type #

Generic KeyHashTag 
Instance details

Defined in Tezos.Crypto

Associated Types

type Rep KeyHashTag :: Type -> Type #

Generic PublicKey 
Instance details

Defined in Tezos.Crypto.Ed25519

Associated Types

type Rep PublicKey :: Type -> Type #

Generic SecretKey 
Instance details

Defined in Tezos.Crypto.Ed25519

Associated Types

type Rep SecretKey :: Type -> Type #

Generic Signature 
Instance details

Defined in Tezos.Crypto.Ed25519

Associated Types

type Rep Signature :: Type -> Type #

Generic PublicKey 
Instance details

Defined in Tezos.Crypto.P256

Associated Types

type Rep PublicKey :: Type -> Type #

Generic SecretKey 
Instance details

Defined in Tezos.Crypto.P256

Associated Types

type Rep SecretKey :: Type -> Type #

Generic Signature 
Instance details

Defined in Tezos.Crypto.P256

Associated Types

type Rep Signature :: Type -> Type #

Generic PublicKey 
Instance details

Defined in Tezos.Crypto.Secp256k1

Associated Types

type Rep PublicKey :: Type -> Type #

Generic SecretKey 
Instance details

Defined in Tezos.Crypto.Secp256k1

Associated Types

type Rep SecretKey :: Type -> Type #

Generic Signature 
Instance details

Defined in Tezos.Crypto.Secp256k1

Associated Types

type Rep Signature :: Type -> Type #

Generic CustomParserException 
Instance details

Defined in Michelson.Parser.Error

Associated Types

type Rep CustomParserException :: Type -> Type #

Generic StringLiteralParserException 
Instance details

Defined in Michelson.Parser.Error

Associated Types

type Rep StringLiteralParserException :: Type -> Type #

Generic EpNameFromRefAnnError 
Instance details

Defined in Michelson.Untyped.EntryPoints

Associated Types

type Rep EpNameFromRefAnnError :: Type -> Type #

Generic Positive 
Instance details

Defined in Util.Positive

Associated Types

type Rep Positive :: Type -> Type #

Methods

from :: Positive -> Rep Positive x #

to :: Rep Positive x -> Positive #

Generic Pos 
Instance details

Defined in Michelson.ErrorPos

Associated Types

type Rep Pos :: Type -> Type #

Methods

from :: Pos -> Rep Pos x #

to :: Rep Pos x -> Pos #

Generic SrcPos 
Instance details

Defined in Michelson.ErrorPos

Associated Types

type Rep SrcPos :: Type -> Type #

Methods

from :: SrcPos -> Rep SrcPos x #

to :: Rep SrcPos x -> SrcPos #

Generic LetName 
Instance details

Defined in Michelson.ErrorPos

Associated Types

type Rep LetName :: Type -> Type #

Methods

from :: LetName -> Rep LetName x #

to :: Rep LetName x -> LetName #

Generic InstrCallStack 
Instance details

Defined in Michelson.ErrorPos

Associated Types

type Rep InstrCallStack :: Type -> Type #

Generic BadTypeForScope 
Instance details

Defined in Michelson.Typed.Scope

Associated Types

type Rep BadTypeForScope :: Type -> Type #

Generic EntriesOrder 
Instance details

Defined in Michelson.Untyped.Contract

Associated Types

type Rep EntriesOrder :: Type -> Type #

Generic StackRef 
Instance details

Defined in Michelson.Untyped.Ext

Associated Types

type Rep StackRef :: Type -> Type #

Methods

from :: StackRef -> Rep StackRef x #

to :: Rep StackRef x -> StackRef #

Generic Var 
Instance details

Defined in Michelson.Untyped.Ext

Associated Types

type Rep Var :: Type -> Type #

Methods

from :: Var -> Rep Var x #

to :: Rep Var x -> Var #

Generic TyVar 
Instance details

Defined in Michelson.Untyped.Ext

Associated Types

type Rep TyVar :: Type -> Type #

Methods

from :: TyVar -> Rep TyVar x #

to :: Rep TyVar x -> TyVar #

Generic StackTypePattern 
Instance details

Defined in Michelson.Untyped.Ext

Associated Types

type Rep StackTypePattern :: Type -> Type #

Generic StackFn 
Instance details

Defined in Michelson.Untyped.Ext

Associated Types

type Rep StackFn :: Type -> Type #

Methods

from :: StackFn -> Rep StackFn x #

to :: Rep StackFn x -> StackFn #

Generic PrintComment 
Instance details

Defined in Michelson.Untyped.Ext

Associated Types

type Rep PrintComment :: Type -> Type #

Generic Type 
Instance details

Defined in Michelson.Untyped.Type

Associated Types

type Rep Type :: Type -> Type #

Methods

from :: Type -> Rep Type x #

to :: Rep Type x -> Type #

Generic ParameterType 
Instance details

Defined in Michelson.Untyped.Type

Associated Types

type Rep ParameterType :: Type -> Type #

Generic T 
Instance details

Defined in Michelson.Untyped.Type

Associated Types

type Rep T :: Type -> Type #

Methods

from :: T -> Rep T x #

to :: Rep T x -> T #

Generic Undefined 
Instance details

Defined in Universum.Debug

Associated Types

type Rep Undefined :: Type -> Type #

Generic Doc 
Instance details

Defined in Text.PrettyPrint.HughesPJ

Associated Types

type Rep Doc :: Type -> Type #

Methods

from :: Doc -> Rep Doc x #

to :: Rep Doc x -> Doc #

Generic TextDetails 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Associated Types

type Rep TextDetails :: Type -> Type #

Generic ModName 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep ModName :: Type -> Type #

Methods

from :: ModName -> Rep ModName x #

to :: Rep ModName x -> ModName #

Generic PkgName 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep PkgName :: Type -> Type #

Methods

from :: PkgName -> Rep PkgName x #

to :: Rep PkgName x -> PkgName #

Generic Module 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Module :: Type -> Type #

Methods

from :: Module -> Rep Module x #

to :: Rep Module x -> Module #

Generic OccName 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep OccName :: Type -> Type #

Methods

from :: OccName -> Rep OccName x #

to :: Rep OccName x -> OccName #

Generic NameFlavour 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep NameFlavour :: Type -> Type #

Generic DatatypeInfo 
Instance details

Defined in Language.Haskell.TH.Datatype

Associated Types

type Rep DatatypeInfo :: Type -> Type #

Generic DatatypeVariant 
Instance details

Defined in Language.Haskell.TH.Datatype

Associated Types

type Rep DatatypeVariant :: Type -> Type #

Generic ConstructorInfo 
Instance details

Defined in Language.Haskell.TH.Datatype

Associated Types

type Rep ConstructorInfo :: Type -> Type #

Generic ConstructorVariant 
Instance details

Defined in Language.Haskell.TH.Datatype

Associated Types

type Rep ConstructorVariant :: Type -> Type #

Generic FieldStrictness 
Instance details

Defined in Language.Haskell.TH.Datatype

Associated Types

type Rep FieldStrictness :: Type -> Type #

Generic Unpackedness 
Instance details

Defined in Language.Haskell.TH.Datatype

Associated Types

type Rep Unpackedness :: Type -> Type #

Generic Strictness 
Instance details

Defined in Language.Haskell.TH.Datatype

Associated Types

type Rep Strictness :: Type -> Type #

Generic DTypeArg 
Instance details

Defined in Language.Haskell.TH.Desugar.Core

Associated Types

type Rep DTypeArg :: Type -> Type #

Methods

from :: DTypeArg -> Rep DTypeArg x #

to :: Rep DTypeArg x -> DTypeArg #

Generic DExp 
Instance details

Defined in Language.Haskell.TH.Desugar.AST

Associated Types

type Rep DExp :: Type -> Type #

Methods

from :: DExp -> Rep DExp x #

to :: Rep DExp x -> DExp #

Generic DPat 
Instance details

Defined in Language.Haskell.TH.Desugar.AST

Associated Types

type Rep DPat :: Type -> Type #

Methods

from :: DPat -> Rep DPat x #

to :: Rep DPat x -> DPat #

Generic DType 
Instance details

Defined in Language.Haskell.TH.Desugar.AST

Associated Types

type Rep DType :: Type -> Type #

Methods

from :: DType -> Rep DType x #

to :: Rep DType x -> DType #

Generic DTyVarBndr 
Instance details

Defined in Language.Haskell.TH.Desugar.AST

Associated Types

type Rep DTyVarBndr :: Type -> Type #

Generic DMatch 
Instance details

Defined in Language.Haskell.TH.Desugar.AST

Associated Types

type Rep DMatch :: Type -> Type #

Methods

from :: DMatch -> Rep DMatch x #

to :: Rep DMatch x -> DMatch #

Generic DClause 
Instance details

Defined in Language.Haskell.TH.Desugar.AST

Associated Types

type Rep DClause :: Type -> Type #

Methods

from :: DClause -> Rep DClause x #

to :: Rep DClause x -> DClause #

Generic DLetDec 
Instance details

Defined in Language.Haskell.TH.Desugar.AST

Associated Types

type Rep DLetDec :: Type -> Type #

Methods

from :: DLetDec -> Rep DLetDec x #

to :: Rep DLetDec x -> DLetDec #

Generic NewOrData 
Instance details

Defined in Language.Haskell.TH.Desugar.AST

Associated Types

type Rep NewOrData :: Type -> Type #

Generic DDec 
Instance details

Defined in Language.Haskell.TH.Desugar.AST

Associated Types

type Rep DDec :: Type -> Type #

Methods

from :: DDec -> Rep DDec x #

to :: Rep DDec x -> DDec #

Generic DPatSynDir 
Instance details

Defined in Language.Haskell.TH.Desugar.AST

Associated Types

type Rep DPatSynDir :: Type -> Type #

Generic DTypeFamilyHead 
Instance details

Defined in Language.Haskell.TH.Desugar.AST

Associated Types

type Rep DTypeFamilyHead :: Type -> Type #

Generic DFamilyResultSig 
Instance details

Defined in Language.Haskell.TH.Desugar.AST

Associated Types

type Rep DFamilyResultSig :: Type -> Type #

Generic DCon 
Instance details

Defined in Language.Haskell.TH.Desugar.AST

Associated Types

type Rep DCon :: Type -> Type #

Methods

from :: DCon -> Rep DCon x #

to :: Rep DCon x -> DCon #

Generic DConFields 
Instance details

Defined in Language.Haskell.TH.Desugar.AST

Associated Types

type Rep DConFields :: Type -> Type #

Generic DForeign 
Instance details

Defined in Language.Haskell.TH.Desugar.AST

Associated Types

type Rep DForeign :: Type -> Type #

Methods

from :: DForeign -> Rep DForeign x #

to :: Rep DForeign x -> DForeign #

Generic DPragma 
Instance details

Defined in Language.Haskell.TH.Desugar.AST

Associated Types

type Rep DPragma :: Type -> Type #

Methods

from :: DPragma -> Rep DPragma x #

to :: Rep DPragma x -> DPragma #

Generic DRuleBndr 
Instance details

Defined in Language.Haskell.TH.Desugar.AST

Associated Types

type Rep DRuleBndr :: Type -> Type #

Generic DTySynEqn 
Instance details

Defined in Language.Haskell.TH.Desugar.AST

Associated Types

type Rep DTySynEqn :: Type -> Type #

Generic DInfo 
Instance details

Defined in Language.Haskell.TH.Desugar.AST

Associated Types

type Rep DInfo :: Type -> Type #

Methods

from :: DInfo -> Rep DInfo x #

to :: Rep DInfo x -> DInfo #

Generic DDerivClause 
Instance details

Defined in Language.Haskell.TH.Desugar.AST

Associated Types

type Rep DDerivClause :: Type -> Type #

Generic DDerivStrategy 
Instance details

Defined in Language.Haskell.TH.Desugar.AST

Associated Types

type Rep DDerivStrategy :: Type -> Type #

Generic MyStoreTemplate 
Instance details

Defined in Lorentz.UStore.Haskell

Associated Types

type Rep MyStoreTemplate :: Type -> Type #

Methods

from :: MyStoreTemplate -> Rep MyStoreTemplate x #

to :: Rep MyStoreTemplate x -> MyStoreTemplate #

Generic MyStoreTemplateBig 
Instance details

Defined in Lorentz.UStore.Haskell

Associated Types

type Rep MyStoreTemplateBig :: Type -> Type #

Methods

from :: MyStoreTemplateBig -> Rep MyStoreTemplateBig x #

to :: Rep MyStoreTemplateBig x -> MyStoreTemplateBig #

Generic MyStoreTemplate2 
Instance details

Defined in Lorentz.UStore.Instr

Associated Types

type Rep MyStoreTemplate2 :: Type -> Type #

Methods

from :: MyStoreTemplate2 -> Rep MyStoreTemplate2 x #

to :: Rep MyStoreTemplate2 x -> MyStoreTemplate2 #

Generic MyStoreTemplate3 
Instance details

Defined in Lorentz.UStore.Instr

Associated Types

type Rep MyStoreTemplate3 :: Type -> Type #

Methods

from :: MyStoreTemplate3 -> Rep MyStoreTemplate3 x #

to :: Rep MyStoreTemplate3 x -> MyStoreTemplate3 #

Generic MyStoreTemplate 
Instance details

Defined in Lorentz.UStore.Lift

Associated Types

type Rep MyStoreTemplate :: Type -> Type #

Methods

from :: MyStoreTemplate -> Rep MyStoreTemplate x #

to :: Rep MyStoreTemplate x -> MyStoreTemplate #

Generic MyStoreTemplateBig 
Instance details

Defined in Lorentz.UStore.Lift

Associated Types

type Rep MyStoreTemplateBig :: Type -> Type #

Methods

from :: MyStoreTemplateBig -> Rep MyStoreTemplateBig x #

to :: Rep MyStoreTemplateBig x -> MyStoreTemplateBig #

Generic MyType 
Instance details

Defined in Michelson.Typed.Haskell.Instr.Sum

Associated Types

type Rep MyType :: Type -> Type #

Methods

from :: MyType -> Rep MyType x #

to :: Rep MyType x -> MyType #

Generic MyType' 
Instance details

Defined in Michelson.Typed.Haskell.Instr.Sum

Associated Types

type Rep MyType' :: Type -> Type #

Methods

from :: MyType' -> Rep MyType' x #

to :: Rep MyType' x -> MyType' #

Generic MyEnum 
Instance details

Defined in Michelson.Typed.Haskell.Instr.Sum

Associated Types

type Rep MyEnum :: Type -> Type #

Methods

from :: MyEnum -> Rep MyEnum x #

to :: Rep MyEnum x -> MyEnum #

Generic MyTypeWithNamedField 
Instance details

Defined in Michelson.Typed.Haskell.Instr.Sum

Associated Types

type Rep MyTypeWithNamedField :: Type -> Type #

Methods

from :: MyTypeWithNamedField -> Rep MyTypeWithNamedField x #

to :: Rep MyTypeWithNamedField x -> MyTypeWithNamedField #

Generic MyType2 
Instance details

Defined in Michelson.Typed.Haskell.Instr.Product

Associated Types

type Rep MyType2 :: Type -> Type #

Methods

from :: MyType2 -> Rep MyType2 x #

to :: Rep MyType2 x -> MyType2 #

Generic RefId Source # 
Instance details

Defined in Indigo.Internal.State

Associated Types

type Rep RefId :: Type -> Type #

Methods

from :: RefId -> Rep RefId x #

to :: Rep RefId x -> RefId #

Generic [a]

Since: base-4.6.0.0

Instance details

Defined in GHC.Generics

Associated Types

type Rep [a] :: Type -> Type #

Methods

from :: [a] -> Rep [a] x #

to :: Rep [a] x -> [a] #

Generic (Maybe a)

Since: base-4.6.0.0

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 #

Generic (Par1 p)

Since: base-4.7.0.0

Instance details

Defined in GHC.Generics

Associated Types

type Rep (Par1 p) :: Type -> Type #

Methods

from :: Par1 p -> Rep (Par1 p) x #

to :: Rep (Par1 p) x -> Par1 p #

Generic (Complex a)

Since: base-4.9.0.0

Instance details

Defined in Data.Complex

Associated Types

type Rep (Complex a) :: Type -> Type #

Methods

from :: Complex a -> Rep (Complex a) x #

to :: Rep (Complex a) x -> Complex a #

Generic (Min a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Associated Types

type Rep (Min a) :: Type -> Type #

Methods

from :: Min a -> Rep (Min a) x #

to :: Rep (Min a) x -> Min a #

Generic (Max a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Associated Types

type Rep (Max a) :: Type -> Type #

Methods

from :: Max a -> Rep (Max a) x #

to :: Rep (Max a) x -> Max a #

Generic (First a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Associated Types

type Rep (First a) :: Type -> Type #

Methods

from :: First a -> Rep (First a) x #

to :: Rep (First a) x -> First a #

Generic (Last a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Associated Types

type Rep (Last a) :: Type -> Type #

Methods

from :: Last a -> Rep (Last a) x #

to :: Rep (Last a) x -> Last a #

Generic (WrappedMonoid m)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Associated Types

type Rep (WrappedMonoid m) :: Type -> Type #

Generic (Option a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Associated Types

type Rep (Option a) :: Type -> Type #

Methods

from :: Option a -> Rep (Option a) x #

to :: Rep (Option a) x -> Option a #

Generic (ZipList a)

Since: base-4.7.0.0

Instance details

Defined in Control.Applicative

Associated Types

type Rep (ZipList a) :: Type -> Type #

Methods

from :: ZipList a -> Rep (ZipList a) x #

to :: Rep (ZipList a) x -> ZipList a #

Generic (Identity a)

Since: base-4.8.0.0

Instance details

Defined in Data.Functor.Identity

Associated Types

type Rep (Identity a) :: Type -> Type #

Methods

from :: Identity a -> Rep (Identity a) x #

to :: Rep (Identity a) x -> Identity a #

Generic (First a)

Since: base-4.7.0.0

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 #

Generic (Last a)

Since: base-4.7.0.0

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 #

Generic (Dual a)

Since: base-4.7.0.0

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 #

Generic (Endo a)

Since: base-4.7.0.0

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 #

Generic (Sum a)

Since: base-4.7.0.0

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 #

Generic (Product a)

Since: base-4.7.0.0

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 #

Generic (Down a)

Since: base-4.12.0.0

Instance details

Defined in GHC.Generics

Associated Types

type Rep (Down a) :: Type -> Type #

Methods

from :: Down a -> Rep (Down a) x #

to :: Rep (Down a) x -> Down a #

Generic (NonEmpty a)

Since: base-4.6.0.0

Instance details

Defined in GHC.Generics

Associated Types

type Rep (NonEmpty a) :: Type -> Type #

Methods

from :: NonEmpty a -> Rep (NonEmpty a) x #

to :: Rep (NonEmpty a) x -> NonEmpty a #

Generic (Tree a)

Since: containers-0.5.8

Instance details

Defined in Data.Tree

Associated Types

type Rep (Tree a) :: Type -> Type #

Methods

from :: Tree a -> Rep (Tree a) x #

to :: Rep (Tree a) x -> Tree a #

Generic (FingerTree a)

Since: containers-0.6.1

Instance details

Defined in Data.Sequence.Internal

Associated Types

type Rep (FingerTree a) :: Type -> Type #

Methods

from :: FingerTree a -> Rep (FingerTree a) x #

to :: Rep (FingerTree a) x -> FingerTree a #

Generic (Digit a)

Since: containers-0.6.1

Instance details

Defined in Data.Sequence.Internal

Associated Types

type Rep (Digit a) :: Type -> Type #

Methods

from :: Digit a -> Rep (Digit a) x #

to :: Rep (Digit a) x -> Digit a #

Generic (Node a)

Since: containers-0.6.1

Instance details

Defined in Data.Sequence.Internal

Associated Types

type Rep (Node a) :: Type -> Type #

Methods

from :: Node a -> Rep (Node a) x #

to :: Rep (Node a) x -> Node a #

Generic (Elem a)

Since: containers-0.6.1

Instance details

Defined in Data.Sequence.Internal

Associated Types

type Rep (Elem a) :: Type -> Type #

Methods

from :: Elem a -> Rep (Elem a) x #

to :: Rep (Elem a) x -> Elem a #

Generic (ViewL a)

Since: containers-0.5.8

Instance details

Defined in Data.Sequence.Internal

Associated Types

type Rep (ViewL a) :: Type -> Type #

Methods

from :: ViewL a -> Rep (ViewL a) x #

to :: Rep (ViewL a) x -> ViewL a #

Generic (ViewR a)

Since: containers-0.5.8

Instance details

Defined in Data.Sequence.Internal

Associated Types

type Rep (ViewR a) :: Type -> Type #

Methods

from :: ViewR a -> Rep (ViewR a) x #

to :: Rep (ViewR a) x -> ViewR a #

Generic (ModuleName l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (ModuleName l) :: Type -> Type #

Methods

from :: ModuleName l -> Rep (ModuleName l) x #

to :: Rep (ModuleName l) x -> ModuleName l #

Generic (SpecialCon l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (SpecialCon l) :: Type -> Type #

Methods

from :: SpecialCon l -> Rep (SpecialCon l) x #

to :: Rep (SpecialCon l) x -> SpecialCon l #

Generic (QName l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (QName l) :: Type -> Type #

Methods

from :: QName l -> Rep (QName l) x #

to :: Rep (QName l) x -> QName l #

Generic (Name l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (Name l) :: Type -> Type #

Methods

from :: Name l -> Rep (Name l) x #

to :: Rep (Name l) x -> Name l #

Generic (IPName l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (IPName l) :: Type -> Type #

Methods

from :: IPName l -> Rep (IPName l) x #

to :: Rep (IPName l) x -> IPName l #

Generic (QOp l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (QOp l) :: Type -> Type #

Methods

from :: QOp l -> Rep (QOp l) x #

to :: Rep (QOp l) x -> QOp l #

Generic (Op l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (Op l) :: Type -> Type #

Methods

from :: Op l -> Rep (Op l) x #

to :: Rep (Op l) x -> Op l #

Generic (CName l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (CName l) :: Type -> Type #

Methods

from :: CName l -> Rep (CName l) x #

to :: Rep (CName l) x -> CName l #

Generic (Module l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (Module l) :: Type -> Type #

Methods

from :: Module l -> Rep (Module l) x #

to :: Rep (Module l) x -> Module l #

Generic (ModuleHead l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (ModuleHead l) :: Type -> Type #

Methods

from :: ModuleHead l -> Rep (ModuleHead l) x #

to :: Rep (ModuleHead l) x -> ModuleHead l #

Generic (ExportSpecList l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (ExportSpecList l) :: Type -> Type #

Generic (ExportSpec l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (ExportSpec l) :: Type -> Type #

Methods

from :: ExportSpec l -> Rep (ExportSpec l) x #

to :: Rep (ExportSpec l) x -> ExportSpec l #

Generic (EWildcard l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (EWildcard l) :: Type -> Type #

Methods

from :: EWildcard l -> Rep (EWildcard l) x #

to :: Rep (EWildcard l) x -> EWildcard l #

Generic (Namespace l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (Namespace l) :: Type -> Type #

Methods

from :: Namespace l -> Rep (Namespace l) x #

to :: Rep (Namespace l) x -> Namespace l #

Generic (ImportDecl l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (ImportDecl l) :: Type -> Type #

Methods

from :: ImportDecl l -> Rep (ImportDecl l) x #

to :: Rep (ImportDecl l) x -> ImportDecl l #

Generic (ImportSpecList l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (ImportSpecList l) :: Type -> Type #

Generic (ImportSpec l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (ImportSpec l) :: Type -> Type #

Methods

from :: ImportSpec l -> Rep (ImportSpec l) x #

to :: Rep (ImportSpec l) x -> ImportSpec l #

Generic (Assoc l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (Assoc l) :: Type -> Type #

Methods

from :: Assoc l -> Rep (Assoc l) x #

to :: Rep (Assoc l) x -> Assoc l #

Generic (Decl l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (Decl l) :: Type -> Type #

Methods

from :: Decl l -> Rep (Decl l) x #

to :: Rep (Decl l) x -> Decl l #

Generic (PatternSynDirection l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (PatternSynDirection l) :: Type -> Type #

Generic (TypeEqn l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (TypeEqn l) :: Type -> Type #

Methods

from :: TypeEqn l -> Rep (TypeEqn l) x #

to :: Rep (TypeEqn l) x -> TypeEqn l #

Generic (Annotation l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (Annotation l) :: Type -> Type #

Methods

from :: Annotation l -> Rep (Annotation l) x #

to :: Rep (Annotation l) x -> Annotation l #

Generic (BooleanFormula l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (BooleanFormula l) :: Type -> Type #

Generic (Role l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (Role l) :: Type -> Type #

Methods

from :: Role l -> Rep (Role l) x #

to :: Rep (Role l) x -> Role l #

Generic (DataOrNew l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (DataOrNew l) :: Type -> Type #

Methods

from :: DataOrNew l -> Rep (DataOrNew l) x #

to :: Rep (DataOrNew l) x -> DataOrNew l #

Generic (InjectivityInfo l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (InjectivityInfo l) :: Type -> Type #

Generic (ResultSig l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (ResultSig l) :: Type -> Type #

Methods

from :: ResultSig l -> Rep (ResultSig l) x #

to :: Rep (ResultSig l) x -> ResultSig l #

Generic (DeclHead l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (DeclHead l) :: Type -> Type #

Methods

from :: DeclHead l -> Rep (DeclHead l) x #

to :: Rep (DeclHead l) x -> DeclHead l #

Generic (InstRule l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (InstRule l) :: Type -> Type #

Methods

from :: InstRule l -> Rep (InstRule l) x #

to :: Rep (InstRule l) x -> InstRule l #

Generic (InstHead l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (InstHead l) :: Type -> Type #

Methods

from :: InstHead l -> Rep (InstHead l) x #

to :: Rep (InstHead l) x -> InstHead l #

Generic (Deriving l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (Deriving l) :: Type -> Type #

Methods

from :: Deriving l -> Rep (Deriving l) x #

to :: Rep (Deriving l) x -> Deriving l #

Generic (DerivStrategy l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (DerivStrategy l) :: Type -> Type #

Generic (Binds l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (Binds l) :: Type -> Type #

Methods

from :: Binds l -> Rep (Binds l) x #

to :: Rep (Binds l) x -> Binds l #

Generic (IPBind l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (IPBind l) :: Type -> Type #

Methods

from :: IPBind l -> Rep (IPBind l) x #

to :: Rep (IPBind l) x -> IPBind l #

Generic (Match l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (Match l) :: Type -> Type #

Methods

from :: Match l -> Rep (Match l) x #

to :: Rep (Match l) x -> Match l #

Generic (QualConDecl l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (QualConDecl l) :: Type -> Type #

Methods

from :: QualConDecl l -> Rep (QualConDecl l) x #

to :: Rep (QualConDecl l) x -> QualConDecl l #

Generic (ConDecl l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (ConDecl l) :: Type -> Type #

Methods

from :: ConDecl l -> Rep (ConDecl l) x #

to :: Rep (ConDecl l) x -> ConDecl l #

Generic (FieldDecl l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (FieldDecl l) :: Type -> Type #

Methods

from :: FieldDecl l -> Rep (FieldDecl l) x #

to :: Rep (FieldDecl l) x -> FieldDecl l #

Generic (GadtDecl l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (GadtDecl l) :: Type -> Type #

Methods

from :: GadtDecl l -> Rep (GadtDecl l) x #

to :: Rep (GadtDecl l) x -> GadtDecl l #

Generic (ClassDecl l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (ClassDecl l) :: Type -> Type #

Methods

from :: ClassDecl l -> Rep (ClassDecl l) x #

to :: Rep (ClassDecl l) x -> ClassDecl l #

Generic (InstDecl l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (InstDecl l) :: Type -> Type #

Methods

from :: InstDecl l -> Rep (InstDecl l) x #

to :: Rep (InstDecl l) x -> InstDecl l #

Generic (BangType l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (BangType l) :: Type -> Type #

Methods

from :: BangType l -> Rep (BangType l) x #

to :: Rep (BangType l) x -> BangType l #

Generic (Unpackedness l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (Unpackedness l) :: Type -> Type #

Methods

from :: Unpackedness l -> Rep (Unpackedness l) x #

to :: Rep (Unpackedness l) x -> Unpackedness l #

Generic (Rhs l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (Rhs l) :: Type -> Type #

Methods

from :: Rhs l -> Rep (Rhs l) x #

to :: Rep (Rhs l) x -> Rhs l #

Generic (GuardedRhs l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (GuardedRhs l) :: Type -> Type #

Methods

from :: GuardedRhs l -> Rep (GuardedRhs l) x #

to :: Rep (GuardedRhs l) x -> GuardedRhs l #

Generic (Type l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (Type l) :: Type -> Type #

Methods

from :: Type l -> Rep (Type l) x #

to :: Rep (Type l) x -> Type l #

Generic (MaybePromotedName l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (MaybePromotedName l) :: Type -> Type #

Generic (Promoted l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (Promoted l) :: Type -> Type #

Methods

from :: Promoted l -> Rep (Promoted l) x #

to :: Rep (Promoted l) x -> Promoted l #

Generic (TyVarBind l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (TyVarBind l) :: Type -> Type #

Methods

from :: TyVarBind l -> Rep (TyVarBind l) x #

to :: Rep (TyVarBind l) x -> TyVarBind l #

Generic (FunDep l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (FunDep l) :: Type -> Type #

Methods

from :: FunDep l -> Rep (FunDep l) x #

to :: Rep (FunDep l) x -> FunDep l #

Generic (Context l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (Context l) :: Type -> Type #

Methods

from :: Context l -> Rep (Context l) x #

to :: Rep (Context l) x -> Context l #

Generic (Asst l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (Asst l) :: Type -> Type #

Methods

from :: Asst l -> Rep (Asst l) x #

to :: Rep (Asst l) x -> Asst l #

Generic (Literal l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (Literal l) :: Type -> Type #

Methods

from :: Literal l -> Rep (Literal l) x #

to :: Rep (Literal l) x -> Literal l #

Generic (Sign l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (Sign l) :: Type -> Type #

Methods

from :: Sign l -> Rep (Sign l) x #

to :: Rep (Sign l) x -> Sign l #

Generic (Exp l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (Exp l) :: Type -> Type #

Methods

from :: Exp l -> Rep (Exp l) x #

to :: Rep (Exp l) x -> Exp l #

Generic (XName l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (XName l) :: Type -> Type #

Methods

from :: XName l -> Rep (XName l) x #

to :: Rep (XName l) x -> XName l #

Generic (XAttr l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (XAttr l) :: Type -> Type #

Methods

from :: XAttr l -> Rep (XAttr l) x #

to :: Rep (XAttr l) x -> XAttr l #

Generic (Bracket l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (Bracket l) :: Type -> Type #

Methods

from :: Bracket l -> Rep (Bracket l) x #

to :: Rep (Bracket l) x -> Bracket l #

Generic (Splice l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (Splice l) :: Type -> Type #

Methods

from :: Splice l -> Rep (Splice l) x #

to :: Rep (Splice l) x -> Splice l #

Generic (Safety l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (Safety l) :: Type -> Type #

Methods

from :: Safety l -> Rep (Safety l) x #

to :: Rep (Safety l) x -> Safety l #

Generic (CallConv l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (CallConv l) :: Type -> Type #

Methods

from :: CallConv l -> Rep (CallConv l) x #

to :: Rep (CallConv l) x -> CallConv l #

Generic (ModulePragma l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (ModulePragma l) :: Type -> Type #

Methods

from :: ModulePragma l -> Rep (ModulePragma l) x #

to :: Rep (ModulePragma l) x -> ModulePragma l #

Generic (Overlap l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (Overlap l) :: Type -> Type #

Methods

from :: Overlap l -> Rep (Overlap l) x #

to :: Rep (Overlap l) x -> Overlap l #

Generic (Activation l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (Activation l) :: Type -> Type #

Methods

from :: Activation l -> Rep (Activation l) x #

to :: Rep (Activation l) x -> Activation l #

Generic (Rule l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (Rule l) :: Type -> Type #

Methods

from :: Rule l -> Rep (Rule l) x #

to :: Rep (Rule l) x -> Rule l #

Generic (RuleVar l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (RuleVar l) :: Type -> Type #

Methods

from :: RuleVar l -> Rep (RuleVar l) x #

to :: Rep (RuleVar l) x -> RuleVar l #

Generic (WarningText l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (WarningText l) :: Type -> Type #

Methods

from :: WarningText l -> Rep (WarningText l) x #

to :: Rep (WarningText l) x -> WarningText l #

Generic (Pat l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (Pat l) :: Type -> Type #

Methods

from :: Pat l -> Rep (Pat l) x #

to :: Rep (Pat l) x -> Pat l #

Generic (PXAttr l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (PXAttr l) :: Type -> Type #

Methods

from :: PXAttr l -> Rep (PXAttr l) x #

to :: Rep (PXAttr l) x -> PXAttr l #

Generic (RPatOp l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (RPatOp l) :: Type -> Type #

Methods

from :: RPatOp l -> Rep (RPatOp l) x #

to :: Rep (RPatOp l) x -> RPatOp l #

Generic (RPat l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (RPat l) :: Type -> Type #

Methods

from :: RPat l -> Rep (RPat l) x #

to :: Rep (RPat l) x -> RPat l #

Generic (PatField l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (PatField l) :: Type -> Type #

Methods

from :: PatField l -> Rep (PatField l) x #

to :: Rep (PatField l) x -> PatField l #

Generic (Stmt l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (Stmt l) :: Type -> Type #

Methods

from :: Stmt l -> Rep (Stmt l) x #

to :: Rep (Stmt l) x -> Stmt l #

Generic (QualStmt l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (QualStmt l) :: Type -> Type #

Methods

from :: QualStmt l -> Rep (QualStmt l) x #

to :: Rep (QualStmt l) x -> QualStmt l #

Generic (FieldUpdate l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (FieldUpdate l) :: Type -> Type #

Methods

from :: FieldUpdate l -> Rep (FieldUpdate l) x #

to :: Rep (FieldUpdate l) x -> FieldUpdate l #

Generic (Alt l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (Alt l) :: Type -> Type #

Methods

from :: Alt l -> Rep (Alt l) x #

to :: Rep (Alt l) x -> Alt l #

Generic (Loc a) 
Instance details

Defined in Language.Haskell.Exts.SrcLoc

Associated Types

type Rep (Loc a) :: Type -> Type #

Methods

from :: Loc a -> Rep (Loc a) x #

to :: Rep (Loc a) x -> Loc a #

Generic (UParam entries) 
Instance details

Defined in Lorentz.UParam

Associated Types

type Rep (UParam entries) :: Type -> Type #

Methods

from :: UParam entries -> Rep (UParam entries) x #

to :: Rep (UParam entries) x -> UParam entries #

Generic (VoidResult r) 
Instance details

Defined in Lorentz.Macro

Associated Types

type Rep (VoidResult r) :: Type -> Type #

Methods

from :: VoidResult r -> Rep (VoidResult r) x #

to :: Rep (VoidResult r) x -> VoidResult r #

Generic (UStore a) 
Instance details

Defined in Lorentz.UStore.Types

Associated Types

type Rep (UStore a) :: Type -> Type #

Methods

from :: UStore a -> Rep (UStore a) x #

to :: Rep (UStore a) x -> UStore a #

Generic (ShouldHaveEntryPoints a) 
Instance details

Defined in Lorentz.EntryPoints.Helpers

Associated Types

type Rep (ShouldHaveEntryPoints a) :: Type -> Type #

Generic (ErrorItem t) 
Instance details

Defined in Text.Megaparsec.Error

Associated Types

type Rep (ErrorItem t) :: Type -> Type #

Methods

from :: ErrorItem t -> Rep (ErrorItem t) x #

to :: Rep (ErrorItem t) x -> ErrorItem t #

Generic (ErrorFancy e) 
Instance details

Defined in Text.Megaparsec.Error

Associated Types

type Rep (ErrorFancy e) :: Type -> Type #

Methods

from :: ErrorFancy e -> Rep (ErrorFancy e) x #

to :: Rep (ErrorFancy e) x -> ErrorFancy e #

Generic (PosState s) 
Instance details

Defined in Text.Megaparsec.State

Associated Types

type Rep (PosState s) :: Type -> Type #

Methods

from :: PosState s -> Rep (PosState s) x #

to :: Rep (PosState s) x -> PosState s #

Generic (PrintComment st) 
Instance details

Defined in Michelson.Typed.Instr

Associated Types

type Rep (PrintComment st) :: Type -> Type #

Methods

from :: PrintComment st -> Rep (PrintComment st) x #

to :: Rep (PrintComment st) x -> PrintComment st #

Generic (ExtInstr s) 
Instance details

Defined in Michelson.Typed.Instr

Associated Types

type Rep (ExtInstr s) :: Type -> Type #

Methods

from :: ExtInstr s -> Rep (ExtInstr s) x #

to :: Rep (ExtInstr s) x -> ExtInstr s #

Generic (ParamNotes t) 
Instance details

Defined in Michelson.Typed.EntryPoints

Associated Types

type Rep (ParamNotes t) :: Type -> Type #

Methods

from :: ParamNotes t -> Rep (ParamNotes t) x #

to :: Rep (ParamNotes t) x -> ParamNotes t #

Generic (InstrAbstract op) 
Instance details

Defined in Michelson.Untyped.Instr

Associated Types

type Rep (InstrAbstract op) :: Type -> Type #

Methods

from :: InstrAbstract op -> Rep (InstrAbstract op) x #

to :: Rep (InstrAbstract op) x -> InstrAbstract op #

Generic (Value' op) 
Instance details

Defined in Michelson.Untyped.Value

Associated Types

type Rep (Value' op) :: Type -> Type #

Methods

from :: Value' op -> Rep (Value' op) x #

to :: Rep (Value' op) x -> Value' op #

Generic (Elt op) 
Instance details

Defined in Michelson.Untyped.Value

Associated Types

type Rep (Elt op) :: Type -> Type #

Methods

from :: Elt op -> Rep (Elt op) x #

to :: Rep (Elt op) x -> Elt op #

Generic (Contract' op) 
Instance details

Defined in Michelson.Untyped.Contract

Associated Types

type Rep (Contract' op) :: Type -> Type #

Methods

from :: Contract' op -> Rep (Contract' op) x #

to :: Rep (Contract' op) x -> Contract' op #

Generic (ExtInstrAbstract op) 
Instance details

Defined in Michelson.Untyped.Ext

Associated Types

type Rep (ExtInstrAbstract op) :: Type -> Type #

Generic (TestAssert op) 
Instance details

Defined in Michelson.Untyped.Ext

Associated Types

type Rep (TestAssert op) :: Type -> Type #

Methods

from :: TestAssert op -> Rep (TestAssert op) x #

to :: Rep (TestAssert op) x -> TestAssert op #

Generic (Doc a) 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Associated Types

type Rep (Doc a) :: Type -> Type #

Methods

from :: Doc a -> Rep (Doc a) x #

to :: Rep (Doc a) x -> Doc a #

Generic (Identity a) 
Instance details

Defined in Data.Vinyl.Functor

Associated Types

type Rep (Identity a) :: Type -> Type #

Methods

from :: Identity a -> Rep (Identity a) x #

to :: Rep (Identity a) x -> Identity a #

KnownSymbol s => Generic (ElField '(s, a)) 
Instance details

Defined in Data.Vinyl.Functor

Associated Types

type Rep (ElField '(s, a)) :: Type -> Type #

Methods

from :: ElField '(s, a) -> Rep (ElField '(s, a)) x #

to :: Rep (ElField '(s, a)) x -> ElField '(s, a) #

Generic (Either a b)

Since: base-4.6.0.0

Instance details

Defined in GHC.Generics

Associated Types

type Rep (Either a b) :: Type -> Type #

Methods

from :: Either a b -> Rep (Either a b) x #

to :: Rep (Either a b) x -> Either a b #

Generic (V1 p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Associated Types

type Rep (V1 p) :: Type -> Type #

Methods

from :: V1 p -> Rep (V1 p) x #

to :: Rep (V1 p) x -> V1 p #

Generic (U1 p)

Since: base-4.7.0.0

Instance details

Defined in GHC.Generics

Associated Types

type Rep (U1 p) :: Type -> Type #

Methods

from :: U1 p -> Rep (U1 p) x #

to :: Rep (U1 p) x -> U1 p #

Generic (a, b)

Since: base-4.6.0.0

Instance details

Defined in GHC.Generics

Associated Types

type Rep (a, b) :: Type -> Type #

Methods

from :: (a, b) -> Rep (a, b) x #

to :: Rep (a, b) x -> (a, b) #

Generic (Arg a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Associated Types

type Rep (Arg a b) :: Type -> Type #

Methods

from :: Arg a b -> Rep (Arg a b) x #

to :: Rep (Arg a b) x -> Arg a b #

Generic (WrappedMonad m a)

Since: base-4.7.0.0

Instance details

Defined in Control.Applicative

Associated Types

type Rep (WrappedMonad m a) :: Type -> Type #

Methods

from :: WrappedMonad m a -> Rep (WrappedMonad m a) x #

to :: Rep (WrappedMonad m a) x -> WrappedMonad m a #

Generic (Proxy t)

Since: base-4.6.0.0

Instance details

Defined in GHC.Generics

Associated Types

type Rep (Proxy t) :: Type -> Type #

Methods

from :: Proxy t -> Rep (Proxy t) x #

to :: Rep (Proxy t) x -> Proxy t #

Generic (Bimap a b) 
Instance details

Defined in Data.Bimap

Associated Types

type Rep (Bimap a b) :: Type -> Type #

Methods

from :: Bimap a b -> Rep (Bimap a b) x #

to :: Rep (Bimap a b) x -> Bimap a b #

Generic (Cofree f a) 
Instance details

Defined in Control.Comonad.Cofree

Associated Types

type Rep (Cofree f a) :: Type -> Type #

Methods

from :: Cofree f a -> Rep (Cofree f a) x #

to :: Rep (Cofree f a) x -> Cofree f a #

Generic (Free f a) 
Instance details

Defined in Control.Monad.Free

Associated Types

type Rep (Free f a) :: Type -> Type #

Methods

from :: Free f a -> Rep (Free f a) x #

to :: Rep (Free f a) x -> Free f a #

Generic (View a r) 
Instance details

Defined in Lorentz.Macro

Associated Types

type Rep (View a r) :: Type -> Type #

Methods

from :: View a r -> Rep (View a r) x #

to :: Rep (View a r) x -> View a r #

Generic (Void_ a b) 
Instance details

Defined in Lorentz.Macro

Associated Types

type Rep (Void_ a b) :: Type -> Type #

Methods

from :: Void_ a b -> Rep (Void_ a b) x #

to :: Rep (Void_ a b) x -> Void_ a b #

Generic (MigrationScript oldStore newStore) 
Instance details

Defined in Lorentz.UStore.Migration.Base

Associated Types

type Rep (MigrationScript oldStore newStore) :: Type -> Type #

Methods

from :: MigrationScript oldStore newStore -> Rep (MigrationScript oldStore newStore) x #

to :: Rep (MigrationScript oldStore newStore) x -> MigrationScript oldStore newStore #

Generic (ParameterWrapper deriv cp) 
Instance details

Defined in Lorentz.EntryPoints.Manual

Associated Types

type Rep (ParameterWrapper deriv cp) :: Type -> Type #

Methods

from :: ParameterWrapper deriv cp -> Rep (ParameterWrapper deriv cp) x #

to :: Rep (ParameterWrapper deriv cp) x -> ParameterWrapper deriv cp #

Generic (TAddress p) 
Instance details

Defined in Lorentz.Address

Associated Types

type Rep (TAddress p) :: Type -> Type #

Methods

from :: TAddress p -> Rep (TAddress p) x #

to :: Rep (TAddress p) x -> TAddress p #

Generic (ParseErrorBundle s e) 
Instance details

Defined in Text.Megaparsec.Error

Associated Types

type Rep (ParseErrorBundle s e) :: Type -> Type #

Generic (State s e) 
Instance details

Defined in Text.Megaparsec.State

Associated Types

type Rep (State s e) :: Type -> Type #

Methods

from :: State s e -> Rep (State s e) x #

to :: Rep (State s e) x -> State s e #

Generic (ParseError s e) 
Instance details

Defined in Text.Megaparsec.Error

Associated Types

type Rep (ParseError s e) :: Type -> Type #

Methods

from :: ParseError s e -> Rep (ParseError s e) x #

to :: Rep (ParseError s e) x -> ParseError s e #

Generic (ArithError n m) 
Instance details

Defined in Michelson.Typed.Arith

Associated Types

type Rep (ArithError n m) :: Type -> Type #

Methods

from :: ArithError n m -> Rep (ArithError n m) x #

to :: Rep (ArithError n m) x -> ArithError n m #

Generic (TransferTokens instr p) 
Instance details

Defined in Michelson.Typed.Value

Associated Types

type Rep (TransferTokens instr p) :: Type -> Type #

Methods

from :: TransferTokens instr p -> Rep (TransferTokens instr p) x #

to :: Rep (TransferTokens instr p) x -> TransferTokens instr p #

Generic (Annotation tag) 
Instance details

Defined in Michelson.Untyped.Annotation

Associated Types

type Rep (Annotation tag) :: Type -> Type #

Methods

from :: Annotation tag -> Rep (Annotation tag) x #

to :: Rep (Annotation tag) x -> Annotation tag #

Generic (Rec1 f p)

Since: base-4.7.0.0

Instance details

Defined in GHC.Generics

Associated Types

type Rep (Rec1 f p) :: Type -> Type #

Methods

from :: Rec1 f p -> Rep (Rec1 f p) x #

to :: Rep (Rec1 f p) x -> Rec1 f p #

Generic (URec (Ptr ()) p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Associated Types

type Rep (URec (Ptr ()) p) :: Type -> Type #

Methods

from :: URec (Ptr ()) p -> Rep (URec (Ptr ()) p) x #

to :: Rep (URec (Ptr ()) p) x -> URec (Ptr ()) p #

Generic (URec Char p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Associated Types

type Rep (URec Char p) :: Type -> Type #

Methods

from :: URec Char p -> Rep (URec Char p) x #

to :: Rep (URec Char p) x -> URec Char p #

Generic (URec Double p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Associated Types

type Rep (URec Double p) :: Type -> Type #

Methods

from :: URec Double p -> Rep (URec Double p) x #

to :: Rep (URec Double p) x -> URec Double p #

Generic (URec Float p) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (URec Float p) :: Type -> Type #

Methods

from :: URec Float p -> Rep (URec Float p) x #

to :: Rep (URec Float p) x -> URec Float p #

Generic (URec Int p)

Since: base-4.9.0.0

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 #

Generic (URec Word p)

Since: base-4.9.0.0

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 #

Generic (a, b, c)

Since: base-4.6.0.0

Instance details

Defined in GHC.Generics

Associated Types

type Rep (a, b, c) :: Type -> Type #

Methods

from :: (a, b, c) -> Rep (a, b, c) x #

to :: Rep (a, b, c) x -> (a, b, c) #

Generic (WrappedArrow a b c)

Since: base-4.7.0.0

Instance details

Defined in Control.Applicative

Associated Types

type Rep (WrappedArrow a b c) :: Type -> Type #

Methods

from :: WrappedArrow a b c -> Rep (WrappedArrow a b c) x #

to :: Rep (WrappedArrow a b c) x -> WrappedArrow a b c #

Generic (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Associated Types

type Rep (Const a b) :: Type -> Type #

Methods

from :: Const a b -> Rep (Const a b) x #

to :: Rep (Const a b) x -> Const a b #

Generic (Ap f a)

Since: base-4.12.0.0

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 #

Generic (Alt f a)

Since: base-4.8.0.0

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 #

Generic (Join p a) 
Instance details

Defined in Data.Bifunctor.Join

Associated Types

type Rep (Join p a) :: Type -> Type #

Methods

from :: Join p a -> Rep (Join p a) x #

to :: Rep (Join p a) x -> Join p a #

Generic (Fix p a) 
Instance details

Defined in Data.Bifunctor.Fix

Associated Types

type Rep (Fix p a) :: Type -> Type #

Methods

from :: Fix p a -> Rep (Fix p a) x #

to :: Rep (Fix p a) x -> Fix p a #

Generic (FreeF f a b) 
Instance details

Defined in Control.Monad.Trans.Free

Associated Types

type Rep (FreeF f a b) :: Type -> Type #

Methods

from :: FreeF f a b -> Rep (FreeF f a b) x #

to :: Rep (FreeF f a b) x -> FreeF f a b #

Generic (CofreeF f a b) 
Instance details

Defined in Control.Comonad.Trans.Cofree

Associated Types

type Rep (CofreeF f a b) :: Type -> Type #

Methods

from :: CofreeF f a b -> Rep (CofreeF f a b) x #

to :: Rep (CofreeF f a b) x -> CofreeF f a b #

Generic (Rec f ('[] :: [u])) 
Instance details

Defined in Data.Vinyl.Core

Associated Types

type Rep (Rec f '[]) :: Type -> Type #

Methods

from :: Rec f '[] -> Rep (Rec f '[]) x #

to :: Rep (Rec f '[]) x -> Rec f '[] #

Generic (Rec f rs) => Generic (Rec f (r ': rs)) 
Instance details

Defined in Data.Vinyl.Core

Associated Types

type Rep (Rec f (r ': rs)) :: Type -> Type #

Methods

from :: Rec f (r ': rs) -> Rep (Rec f (r ': rs)) x #

to :: Rep (Rec f (r ': rs)) x -> Rec f (r ': rs) #

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 #

Generic (Const a b) 
Instance details

Defined in Data.Vinyl.Functor

Associated Types

type Rep (Const a b) :: Type -> Type #

Methods

from :: Const a b -> Rep (Const a b) x #

to :: Rep (Const a b) x -> Const a b #

Generic (K1 i c p)

Since: base-4.7.0.0

Instance details

Defined in GHC.Generics

Associated Types

type Rep (K1 i c p) :: Type -> Type #

Methods

from :: K1 i c p -> Rep (K1 i c p) x #

to :: Rep (K1 i c p) x -> K1 i c p #

Generic ((f :+: g) p)

Since: base-4.7.0.0

Instance details

Defined in GHC.Generics

Associated Types

type Rep ((f :+: g) p) :: Type -> Type #

Methods

from :: (f :+: g) p -> Rep ((f :+: g) p) x #

to :: Rep ((f :+: g) p) x -> (f :+: g) p #

Generic ((f :*: g) p)

Since: base-4.7.0.0

Instance details

Defined in GHC.Generics

Associated Types

type Rep ((f :*: g) p) :: Type -> Type #

Methods

from :: (f :*: g) p -> Rep ((f :*: g) p) x #

to :: Rep ((f :*: g) p) x -> (f :*: g) p #

Generic (a, b, c, d)

Since: base-4.6.0.0

Instance details

Defined in GHC.Generics

Associated Types

type Rep (a, b, c, d) :: Type -> Type #

Methods

from :: (a, b, c, d) -> Rep (a, b, c, d) x #

to :: Rep (a, b, c, d) x -> (a, b, c, d) #

Generic (Product f g a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Product

Associated Types

type Rep (Product f g a) :: Type -> Type #

Methods

from :: Product f g a -> Rep (Product f g a) x #

to :: Rep (Product f g a) x -> Product f g a #

Generic (Sum f g a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Sum

Associated Types

type Rep (Sum f g a) :: Type -> Type #

Methods

from :: Sum f g a -> Rep (Sum f g a) x #

to :: Rep (Sum f g a) x -> Sum f g a #

Generic (MUStore oldTemplate newTemplate remDiff touched) 
Instance details

Defined in Lorentz.UStore.Migration.Base

Associated Types

type Rep (MUStore oldTemplate newTemplate remDiff touched) :: Type -> Type #

Methods

from :: MUStore oldTemplate newTemplate remDiff touched -> Rep (MUStore oldTemplate newTemplate remDiff touched) x #

to :: Rep (MUStore oldTemplate newTemplate remDiff touched) x -> MUStore oldTemplate newTemplate remDiff touched #

Generic (M1 i c f p)

Since: base-4.7.0.0

Instance details

Defined in GHC.Generics

Associated Types

type Rep (M1 i c f p) :: Type -> Type #

Methods

from :: M1 i c f p -> Rep (M1 i c f p) x #

to :: Rep (M1 i c f p) x -> M1 i c f p #

Generic ((f :.: g) p)

Since: base-4.7.0.0

Instance details

Defined in GHC.Generics

Associated Types

type Rep ((f :.: g) p) :: Type -> Type #

Methods

from :: (f :.: g) p -> Rep ((f :.: g) p) x #

to :: Rep ((f :.: g) p) x -> (f :.: g) p #

Generic (a, b, c, d, e)

Since: base-4.6.0.0

Instance details

Defined in GHC.Generics

Associated Types

type Rep (a, b, c, d, e) :: Type -> Type #

Methods

from :: (a, b, c, d, e) -> Rep (a, b, c, d, e) x #

to :: Rep (a, b, c, d, e) x -> (a, b, c, d, e) #

Generic (Compose f g a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Compose

Associated Types

type Rep (Compose f g a) :: Type -> Type #

Methods

from :: Compose f g a -> Rep (Compose f g a) x #

to :: Rep (Compose f g a) x -> Compose f g a #

Generic (WrappedBifunctor p a b) 
Instance details

Defined in Data.Bifunctor.Wrapped

Associated Types

type Rep (WrappedBifunctor p a b) :: Type -> Type #

Methods

from :: WrappedBifunctor p a b -> Rep (WrappedBifunctor p a b) x #

to :: Rep (WrappedBifunctor p a b) x -> WrappedBifunctor p a b #

Generic (Joker g a b) 
Instance details

Defined in Data.Bifunctor.Joker

Associated Types

type Rep (Joker g a b) :: Type -> Type #

Methods

from :: Joker g a b -> Rep (Joker g a b) x #

to :: Rep (Joker g a b) x -> Joker g a b #

Generic (Flip p a b) 
Instance details

Defined in Data.Bifunctor.Flip

Associated Types

type Rep (Flip p a b) :: Type -> Type #

Methods

from :: Flip p a b -> Rep (Flip p a b) x #

to :: Rep (Flip p a b) x -> Flip p a b #

Generic (Clown f a b) 
Instance details

Defined in Data.Bifunctor.Clown

Associated Types

type Rep (Clown f a b) :: Type -> Type #

Methods

from :: Clown f a b -> Rep (Clown f a b) x #

to :: Rep (Clown f a b) x -> Clown f a b #

Generic (Compose f g x) 
Instance details

Defined in Data.Vinyl.Functor

Associated Types

type Rep (Compose f g x) :: Type -> Type #

Methods

from :: Compose f g x -> Rep (Compose f g x) x0 #

to :: Rep (Compose f g x) x0 -> Compose f g x #

Generic (a, b, c, d, e, f)

Since: base-4.6.0.0

Instance details

Defined in GHC.Generics

Associated Types

type Rep (a, b, c, d, e, f) :: Type -> Type #

Methods

from :: (a, b, c, d, e, f) -> Rep (a, b, c, d, e, f) x #

to :: Rep (a, b, c, d, e, f) x -> (a, b, c, d, e, f) #

Generic (Sum p q a b) 
Instance details

Defined in Data.Bifunctor.Sum

Associated Types

type Rep (Sum p q a b) :: Type -> Type #

Methods

from :: Sum p q a b -> Rep (Sum p q a b) x #

to :: Rep (Sum p q a b) x -> Sum p q a b #

Generic (Product f g a b) 
Instance details

Defined in Data.Bifunctor.Product

Associated Types

type Rep (Product f g a b) :: Type -> Type #

Methods

from :: Product f g a b -> Rep (Product f g a b) x #

to :: Rep (Product f g a b) x -> Product f g a b #

Generic (a, b, c, d, e, f, g)

Since: base-4.6.0.0

Instance details

Defined in GHC.Generics

Associated Types

type Rep (a, b, c, d, e, f, g) :: Type -> Type #

Methods

from :: (a, b, c, d, e, f, g) -> Rep (a, b, c, d, e, f, g) x #

to :: Rep (a, b, c, d, e, f, g) x -> (a, b, c, d, e, f, g) #

Generic (Tannen f p a b) 
Instance details

Defined in Data.Bifunctor.Tannen

Associated Types

type Rep (Tannen f p a b) :: Type -> Type #

Methods

from :: Tannen f p a b -> Rep (Tannen f p a b) x #

to :: Rep (Tannen f p a b) x -> Tannen f p a b #

Generic (Biff p f g a b) 
Instance details

Defined in Data.Bifunctor.Biff

Associated Types

type Rep (Biff p f g a b) :: Type -> Type #

Methods

from :: Biff p f g a b -> Rep (Biff p f g a b) x #

to :: Rep (Biff p f g a b) x -> Biff p f g a b #

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 IsLabel (x :: Symbol) a where #

Methods

fromLabel :: a #

Instances

Instances details
(KnownSymbol name, s ~ name) => IsLabel s (Label name) 
Instance details

Defined in Util.Label

Methods

fromLabel :: Label name #

name ~ name' => IsLabel name' (Name name) 
Instance details

Defined in Named.Internal

Methods

fromLabel :: Name name #

(p ~ NamedF f a name, InjValue f) => IsLabel name (a -> Param p) 
Instance details

Defined in Named.Internal

Methods

fromLabel :: a -> Param p #

(name ~ name', a ~ a', InjValue f) => IsLabel name (a -> NamedF f a' name') 
Instance details

Defined in Named.Internal

Methods

fromLabel :: a -> NamedF f a' name' #

class Semigroup a where #

The class of semigroups (types with an associative binary operation).

Instances should satisfy the following:

Associativity
x <> (y <> z) = (x <> y) <> z

Since: base-4.9.0.0

Minimal complete definition

(<>)

Methods

sconcat :: NonEmpty a -> a #

Reduce a non-empty list with <>

The default definition should be sufficient, but this can be overridden for efficiency.

stimes :: Integral b => b -> a -> a #

Repeat a value n times.

Given that this works on a Semigroup it is allowed to fail if you request 0 or fewer repetitions, and the default definition will do so.

By making this a member of the class, idempotent semigroups and monoids can upgrade this to execute in O(1) by picking stimes = stimesIdempotent or stimes = stimesIdempotentMonoid respectively.

Instances

Instances details
Semigroup Ordering

Since: base-4.9.0.0

Instance details

Defined in GHC.Base

Semigroup ()

Since: base-4.9.0.0

Instance details

Defined in GHC.Base

Methods

(<>) :: () -> () -> () #

sconcat :: NonEmpty () -> () #

stimes :: Integral b => b -> () -> () #

Semigroup ByteString 
Instance details

Defined in Data.ByteString.Internal

Semigroup ByteString 
Instance details

Defined in Data.ByteString.Lazy.Internal

Semigroup Builder 
Instance details

Defined in Data.ByteString.Builder.Internal

Semigroup More 
Instance details

Defined in Data.Attoparsec.Internal.Types

Methods

(<>) :: More -> More -> More #

sconcat :: NonEmpty More -> More #

stimes :: Integral b => b -> More -> More #

Semigroup Void

Since: base-4.9.0.0

Instance details

Defined in Data.Void

Methods

(<>) :: Void -> Void -> Void #

sconcat :: NonEmpty Void -> Void #

stimes :: Integral b => b -> Void -> Void #

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 #

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 #

Semigroup String 
Instance details

Defined in Basement.UTF8.Base

Semigroup IntSet

Since: containers-0.5.7

Instance details

Defined in Data.IntSet.Internal

Semigroup MText 
Instance details

Defined in Michelson.Text

Methods

(<>) :: MText -> MText -> MText #

sconcat :: NonEmpty MText -> MText #

stimes :: Integral b => b -> MText -> MText #

Semigroup ContractDoc

Contract documentation assembly primarily relies on this instance.

Instance details

Defined in Michelson.Doc

Semigroup Pos 
Instance details

Defined in Text.Megaparsec.Pos

Methods

(<>) :: Pos -> Pos -> Pos #

sconcat :: NonEmpty Pos -> Pos #

stimes :: Integral b => b -> Pos -> Pos #

Semigroup AnalyzerRes 
Instance details

Defined in Michelson.Analyzer

Semigroup AnnotationSet 
Instance details

Defined in Michelson.Untyped.Annotation

Semigroup VarAnn 
Instance details

Defined in Michelson.Untyped.Annotation

Semigroup Doc 
Instance details

Defined in Text.PrettyPrint.HughesPJ

Methods

(<>) :: Doc -> Doc -> Doc #

sconcat :: NonEmpty Doc -> Doc #

stimes :: Integral b => b -> Doc -> Doc #

Semigroup ByteArray 
Instance details

Defined in Data.Primitive.ByteArray

Semigroup PromDPatInfos 
Instance details

Defined in Data.Singletons.Syntax

Methods

(<>) :: PromDPatInfos -> PromDPatInfos -> PromDPatInfos #

sconcat :: NonEmpty PromDPatInfos -> PromDPatInfos #

stimes :: Integral b => b -> PromDPatInfos -> PromDPatInfos #

Semigroup ULetDecEnv 
Instance details

Defined in Data.Singletons.Syntax

Methods

(<>) :: ULetDecEnv -> ULetDecEnv -> ULetDecEnv #

sconcat :: NonEmpty ULetDecEnv -> ULetDecEnv #

stimes :: Integral b => b -> ULetDecEnv -> ULetDecEnv #

Semigroup DocCollector 
Instance details

Defined in Lorentz.UStore.Doc

Methods

(<>) :: DocCollector -> DocCollector -> DocCollector #

sconcat :: NonEmpty DocCollector -> DocCollector #

stimes :: Integral b => b -> DocCollector -> DocCollector #

Class () (Semigroup a) 
Instance details

Defined in Data.Constraint

Methods

cls :: Semigroup a :- () #

() :=> (Semigroup [a]) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Semigroup [a] #

() :=> (Semigroup Ordering) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Semigroup Ordering #

() :=> (Semigroup ()) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Semigroup () #

() :=> (Semigroup (Dict a)) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Semigroup (Dict a) #

Semigroup [a]

Since: base-4.9.0.0

Instance details

Defined in GHC.Base

Methods

(<>) :: [a] -> [a] -> [a] #

sconcat :: NonEmpty [a] -> [a] #

stimes :: Integral b => b -> [a] -> [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 => Semigroup (IO a)

Since: base-4.10.0.0

Instance details

Defined in GHC.Base

Methods

(<>) :: IO a -> IO a -> IO a #

sconcat :: NonEmpty (IO a) -> IO a #

stimes :: Integral b => b -> IO a -> IO a #

Semigroup p => Semigroup (Par1 p)

Since: base-4.12.0.0

Instance details

Defined in GHC.Generics

Methods

(<>) :: Par1 p -> Par1 p -> Par1 p #

sconcat :: NonEmpty (Par1 p) -> Par1 p #

stimes :: Integral b => b -> Par1 p -> Par1 p #

Semigroup (IResult a) 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

(<>) :: IResult a -> IResult a -> IResult a #

sconcat :: NonEmpty (IResult a) -> IResult a #

stimes :: Integral b => b -> IResult a -> IResult a #

Semigroup (Result a) 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

(<>) :: Result a -> Result a -> Result a #

sconcat :: NonEmpty (Result a) -> Result a #

stimes :: Integral b => b -> Result a -> Result a #

Semigroup (Parser a) 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

(<>) :: Parser a -> Parser a -> Parser a #

sconcat :: NonEmpty (Parser a) -> Parser a #

stimes :: Integral b => b -> Parser a -> Parser a #

Ord a => Semigroup (Min a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

(<>) :: Min a -> Min a -> Min a #

sconcat :: NonEmpty (Min a) -> Min a #

stimes :: Integral b => b -> Min a -> Min a #

Ord a => Semigroup (Max a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

(<>) :: Max a -> Max a -> Max a #

sconcat :: NonEmpty (Max a) -> Max a #

stimes :: Integral b => b -> Max a -> Max a #

Semigroup (First a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

(<>) :: First a -> First a -> First a #

sconcat :: NonEmpty (First a) -> First a #

stimes :: Integral b => b -> First a -> First a #

Semigroup (Last a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

(<>) :: Last a -> Last a -> Last a #

sconcat :: NonEmpty (Last a) -> Last a #

stimes :: Integral b => b -> Last a -> Last a #

Monoid m => Semigroup (WrappedMonoid m)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Semigroup a => Semigroup (Option a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

(<>) :: Option a -> Option a -> Option a #

sconcat :: NonEmpty (Option a) -> Option a #

stimes :: Integral b => b -> Option a -> Option a #

Semigroup a => Semigroup (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

Methods

(<>) :: Identity a -> Identity a -> Identity a #

sconcat :: NonEmpty (Identity a) -> Identity a #

stimes :: Integral b => b -> Identity a -> Identity 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 #

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 #

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 #

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 #

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 => 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 #

Semigroup a => Semigroup (Down a)

Since: base-4.11.0.0

Instance details

Defined in Data.Ord

Methods

(<>) :: Down a -> Down a -> Down a #

sconcat :: NonEmpty (Down a) -> Down a #

stimes :: Integral b => b -> Down a -> Down a #

Semigroup (NonEmpty a)

Since: base-4.9.0.0

Instance details

Defined in GHC.Base

Methods

(<>) :: NonEmpty a -> NonEmpty a -> NonEmpty a #

sconcat :: NonEmpty (NonEmpty a) -> NonEmpty a #

stimes :: Integral b => b -> NonEmpty a -> NonEmpty a #

PrimType ty => Semigroup (UArray ty) 
Instance details

Defined in Basement.UArray.Base

Methods

(<>) :: UArray ty -> UArray ty -> UArray ty #

sconcat :: NonEmpty (UArray ty) -> UArray ty #

stimes :: Integral b => b -> UArray ty -> UArray ty #

PrimType ty => Semigroup (Block ty) 
Instance details

Defined in Basement.Block.Base

Methods

(<>) :: Block ty -> Block ty -> Block ty #

sconcat :: NonEmpty (Block ty) -> Block ty #

stimes :: Integral b => b -> Block ty -> Block ty #

Semigroup (CountOf ty) 
Instance details

Defined in Basement.Types.OffsetSize

Methods

(<>) :: CountOf ty -> CountOf ty -> CountOf ty #

sconcat :: NonEmpty (CountOf ty) -> CountOf ty #

stimes :: Integral b => b -> CountOf ty -> CountOf ty #

Semigroup (Dict a) 
Instance details

Defined in Data.Constraint

Methods

(<>) :: Dict a -> Dict a -> Dict a #

sconcat :: NonEmpty (Dict a) -> Dict a #

stimes :: Integral b => b -> Dict a -> Dict a #

Semigroup (IntMap a)

Since: containers-0.5.7

Instance details

Defined in Data.IntMap.Internal

Methods

(<>) :: IntMap a -> IntMap a -> IntMap a #

sconcat :: NonEmpty (IntMap a) -> IntMap a #

stimes :: Integral b => b -> IntMap a -> IntMap a #

Semigroup (Seq a)

Since: containers-0.5.7

Instance details

Defined in Data.Sequence.Internal

Methods

(<>) :: Seq a -> Seq a -> Seq a #

sconcat :: NonEmpty (Seq a) -> Seq a #

stimes :: Integral b => b -> Seq a -> Seq a #

Ord a => Semigroup (Set a)

Since: containers-0.5.7

Instance details

Defined in Data.Set.Internal

Methods

(<>) :: Set a -> Set a -> Set a #

sconcat :: NonEmpty (Set a) -> Set a #

stimes :: Integral b => b -> Set a -> Set a #

Semigroup (DList a) 
Instance details

Defined in Data.DList

Methods

(<>) :: DList a -> DList a -> DList a #

sconcat :: NonEmpty (DList a) -> DList a #

stimes :: Integral b => b -> DList a -> DList a #

Prim a => Semigroup (Vector a) 
Instance details

Defined in Data.Vector.Primitive

Methods

(<>) :: Vector a -> Vector a -> Vector a #

sconcat :: NonEmpty (Vector a) -> Vector a #

stimes :: Integral b => b -> Vector a -> Vector a #

Storable a => Semigroup (Vector a) 
Instance details

Defined in Data.Vector.Storable

Methods

(<>) :: Vector a -> Vector a -> Vector a #

sconcat :: NonEmpty (Vector a) -> Vector a #

stimes :: Integral b => b -> Vector a -> Vector a #

(Hashable a, Eq a) => Semigroup (HashSet a) 
Instance details

Defined in Data.HashSet.Base

Methods

(<>) :: HashSet a -> HashSet a -> HashSet a #

sconcat :: NonEmpty (HashSet a) -> HashSet a #

stimes :: Integral b => b -> HashSet a -> HashSet a #

Semigroup (Vector a) 
Instance details

Defined in Data.Vector

Methods

(<>) :: Vector a -> Vector a -> Vector a #

sconcat :: NonEmpty (Vector a) -> Vector a #

stimes :: Integral b => b -> Vector a -> Vector a #

Semigroup (UStore a) 
Instance details

Defined in Lorentz.UStore.Types

Methods

(<>) :: UStore a -> UStore a -> UStore a #

sconcat :: NonEmpty (UStore a) -> UStore a #

stimes :: Integral b => b -> UStore a -> UStore a #

Semigroup a => Semigroup (May a) 
Instance details

Defined in Lens.Micro.Mtl.Internal

Methods

(<>) :: May a -> May a -> May a #

sconcat :: NonEmpty (May a) -> May a #

stimes :: Integral b => b -> May a -> May a #

Semigroup (PrintComment st) 
Instance details

Defined in Michelson.Typed.Instr

Semigroup (Doc a) 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Methods

(<>) :: Doc a -> Doc a -> Doc a #

sconcat :: NonEmpty (Doc a) -> Doc a #

stimes :: Integral b => b -> Doc a -> Doc a #

Semigroup (PrimArray a)

Since: primitive-0.6.4.0

Instance details

Defined in Data.Primitive.PrimArray

Methods

(<>) :: PrimArray a -> PrimArray a -> PrimArray a #

sconcat :: NonEmpty (PrimArray a) -> PrimArray a #

stimes :: Integral b => b -> PrimArray a -> PrimArray a #

Semigroup (SmallArray a)

Since: primitive-0.6.3.0

Instance details

Defined in Data.Primitive.SmallArray

Semigroup (Array a)

Since: primitive-0.6.3.0

Instance details

Defined in Data.Primitive.Array

Methods

(<>) :: Array a -> Array a -> Array a #

sconcat :: NonEmpty (Array a) -> Array a #

stimes :: Integral b => b -> Array a -> Array a #

Semigroup t => Semigroup (ElField '(s, t)) 
Instance details

Defined in Data.Vinyl.Functor

Methods

(<>) :: ElField '(s, t) -> ElField '(s, t) -> ElField '(s, t) #

sconcat :: NonEmpty (ElField '(s, t)) -> ElField '(s, t) #

stimes :: Integral b => b -> ElField '(s, t) -> ElField '(s, t) #

Semigroup (MergeSet a) 
Instance details

Defined in Data.Set.Internal

Methods

(<>) :: MergeSet a -> MergeSet a -> MergeSet a #

sconcat :: NonEmpty (MergeSet a) -> MergeSet a #

stimes :: Integral b => b -> MergeSet a -> MergeSet a #

Class (Semigroup a) (Monoid a) 
Instance details

Defined in Data.Constraint

Methods

cls :: Monoid a :- Semigroup a #

(Semigroup a) :=> (Semigroup (Maybe a)) 
Instance details

Defined in Data.Constraint

Methods

ins :: Semigroup a :- Semigroup (Maybe a) #

(Semigroup a) :=> (Semigroup (Const a b)) 
Instance details

Defined in Data.Constraint

Methods

ins :: Semigroup a :- Semigroup (Const a b) #

(Semigroup a) :=> (Semigroup (Identity a)) 
Instance details

Defined in Data.Constraint

(Semigroup a) :=> (Semigroup (IO a)) 
Instance details

Defined in Data.Constraint

Methods

ins :: Semigroup a :- Semigroup (IO a) #

Semigroup b => Semigroup (a -> b)

Since: base-4.9.0.0

Instance details

Defined in GHC.Base

Methods

(<>) :: (a -> b) -> (a -> b) -> a -> b #

sconcat :: NonEmpty (a -> b) -> a -> b #

stimes :: Integral b0 => b0 -> (a -> b) -> a -> b #

Semigroup (Either a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Either

Methods

(<>) :: Either a b -> Either a b -> Either a b #

sconcat :: NonEmpty (Either a b) -> Either a b #

stimes :: Integral b0 => b0 -> Either a b -> Either a b #

Semigroup (V1 p)

Since: base-4.12.0.0

Instance details

Defined in GHC.Generics

Methods

(<>) :: V1 p -> V1 p -> V1 p #

sconcat :: NonEmpty (V1 p) -> V1 p #

stimes :: Integral b => b -> V1 p -> V1 p #

Semigroup (U1 p)

Since: base-4.12.0.0

Instance details

Defined in GHC.Generics

Methods

(<>) :: U1 p -> U1 p -> U1 p #

sconcat :: NonEmpty (U1 p) -> U1 p #

stimes :: Integral b => b -> U1 p -> U1 p #

(Semigroup a, Semigroup b) => Semigroup (a, b)

Since: base-4.9.0.0

Instance details

Defined in GHC.Base

Methods

(<>) :: (a, b) -> (a, b) -> (a, b) #

sconcat :: NonEmpty (a, b) -> (a, b) #

stimes :: Integral b0 => b0 -> (a, b) -> (a, b) #

(Eq k, Hashable k) => Semigroup (HashMap k v) 
Instance details

Defined in Data.HashMap.Base

Methods

(<>) :: HashMap k v -> HashMap k v -> HashMap k v #

sconcat :: NonEmpty (HashMap k v) -> HashMap k v #

stimes :: Integral b => b -> HashMap k v -> HashMap k v #

Ord k => Semigroup (Map k v) 
Instance details

Defined in Data.Map.Internal

Methods

(<>) :: Map k v -> Map k v -> Map k v #

sconcat :: NonEmpty (Map k v) -> Map k v #

stimes :: Integral b => b -> Map k v -> Map k v #

Semigroup (Parser i a) 
Instance details

Defined in Data.Attoparsec.Internal.Types

Methods

(<>) :: Parser i a -> Parser i a -> Parser i a #

sconcat :: NonEmpty (Parser i a) -> Parser i a #

stimes :: Integral b => b -> Parser i a -> Parser i a #

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 #

Semigroup (ReifiedFold s a) 
Instance details

Defined in Control.Lens.Reified

Methods

(<>) :: ReifiedFold s a -> ReifiedFold s a -> ReifiedFold s a #

sconcat :: NonEmpty (ReifiedFold s a) -> ReifiedFold s a #

stimes :: Integral b => b -> ReifiedFold s a -> ReifiedFold s a #

Semigroup (f a) => Semigroup (Indexing f a) 
Instance details

Defined in Control.Lens.Internal.Indexed

Methods

(<>) :: Indexing f a -> Indexing f a -> Indexing f a #

sconcat :: NonEmpty (Indexing f a) -> Indexing f a #

stimes :: Integral b => b -> Indexing f a -> Indexing f a #

Semigroup (s :-> s) 
Instance details

Defined in Lorentz.Base

Methods

(<>) :: (s :-> s) -> (s :-> s) -> s :-> s #

sconcat :: NonEmpty (s :-> s) -> s :-> s #

stimes :: Integral b => b -> (s :-> s) -> s :-> s #

Ord k => Semigroup (BigMap k v) 
Instance details

Defined in Michelson.Typed.Haskell.Value

Methods

(<>) :: BigMap k v -> BigMap k v -> BigMap k v #

sconcat :: NonEmpty (BigMap k v) -> BigMap k v #

stimes :: Integral b => b -> BigMap k v -> BigMap k v #

(Stream s, Ord e) => Semigroup (ParseError s e) 
Instance details

Defined in Text.Megaparsec.Error

Methods

(<>) :: ParseError s e -> ParseError s e -> ParseError s e #

sconcat :: NonEmpty (ParseError s e) -> ParseError s e #

stimes :: Integral b => b -> ParseError s e -> ParseError s e #

Semigroup a => Semigroup (Err e a) 
Instance details

Defined in Lens.Micro.Mtl.Internal

Methods

(<>) :: Err e a -> Err e a -> Err e a #

sconcat :: NonEmpty (Err e a) -> Err e a #

stimes :: Integral b => b -> Err e a -> Err e a #

Semigroup (Instr s s) 
Instance details

Defined in Michelson.Typed.Instr

Methods

(<>) :: Instr s s -> Instr s s -> Instr s s #

sconcat :: NonEmpty (Instr s s) -> Instr s s #

stimes :: Integral b => b -> Instr s s -> Instr s s #

Applicative f => Semigroup (Traversed a f) 
Instance details

Defined in Lens.Micro

Methods

(<>) :: Traversed a f -> Traversed a f -> Traversed a f #

sconcat :: NonEmpty (Traversed a f) -> Traversed a f #

stimes :: Integral b => b -> Traversed a f -> Traversed a f #

(Semigroup a, Semigroup b) :=> (Semigroup (a, b)) 
Instance details

Defined in Data.Constraint

Methods

ins :: (Semigroup a, Semigroup b) :- Semigroup (a, b) #

Semigroup (f p) => Semigroup (Rec1 f p)

Since: base-4.12.0.0

Instance details

Defined in GHC.Generics

Methods

(<>) :: Rec1 f p -> Rec1 f p -> Rec1 f p #

sconcat :: NonEmpty (Rec1 f p) -> Rec1 f p #

stimes :: Integral b => b -> Rec1 f p -> Rec1 f p #

(Semigroup a, Semigroup b, Semigroup c) => Semigroup (a, b, c)

Since: base-4.9.0.0

Instance details

Defined in GHC.Base

Methods

(<>) :: (a, b, c) -> (a, b, c) -> (a, b, c) #

sconcat :: NonEmpty (a, b, c) -> (a, b, c) #

stimes :: Integral b0 => b0 -> (a, b, c) -> (a, b, c) #

Semigroup a => Semigroup (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 #

sconcat :: NonEmpty (Const a b) -> Const a b #

stimes :: Integral b0 => b0 -> Const a b -> Const a b #

(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 #

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 #

Semigroup (ReifiedIndexedFold i s a) 
Instance details

Defined in Control.Lens.Reified

Semigroup (Rec f ('[] :: [u])) 
Instance details

Defined in Data.Vinyl.Core

Methods

(<>) :: Rec f '[] -> Rec f '[] -> Rec f '[] #

sconcat :: NonEmpty (Rec f '[]) -> Rec f '[] #

stimes :: Integral b => b -> Rec f '[] -> Rec f '[] #

(Semigroup (f r), Semigroup (Rec f rs)) => Semigroup (Rec f (r ': rs)) 
Instance details

Defined in Data.Vinyl.Core

Methods

(<>) :: Rec f (r ': rs) -> Rec f (r ': rs) -> Rec f (r ': rs) #

sconcat :: NonEmpty (Rec f (r ': rs)) -> Rec f (r ': rs) #

stimes :: Integral b => b -> Rec f (r ': rs) -> Rec f (r ': rs) #

(Monad m, Semigroup r) => Semigroup (Effect m r a) 
Instance details

Defined in Lens.Micro.Mtl.Internal

Methods

(<>) :: Effect m r a -> Effect m r a -> Effect m r a #

sconcat :: NonEmpty (Effect m r a) -> Effect m r a #

stimes :: Integral b => b -> Effect m r a -> Effect m r a #

Reifies s (ReifiedMonoid a) => Semigroup (ReflectedMonoid a s) 
Instance details

Defined in Data.Reflection

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 c => Semigroup (K1 i c p)

Since: base-4.12.0.0

Instance details

Defined in GHC.Generics

Methods

(<>) :: K1 i c p -> K1 i c p -> K1 i c p #

sconcat :: NonEmpty (K1 i c p) -> K1 i c p #

stimes :: Integral b => b -> K1 i c p -> K1 i c p #

(Semigroup (f p), Semigroup (g p)) => Semigroup ((f :*: g) p)

Since: base-4.12.0.0

Instance details

Defined in GHC.Generics

Methods

(<>) :: (f :*: g) p -> (f :*: g) p -> (f :*: g) p #

sconcat :: NonEmpty ((f :*: g) p) -> (f :*: g) p #

stimes :: Integral b => b -> (f :*: g) p -> (f :*: g) p #

(Semigroup a, Semigroup b, Semigroup c, Semigroup d) => Semigroup (a, b, c, d)

Since: base-4.9.0.0

Instance details

Defined in GHC.Base

Methods

(<>) :: (a, b, c, d) -> (a, b, c, d) -> (a, b, c, d) #

sconcat :: NonEmpty (a, b, c, d) -> (a, b, c, d) #

stimes :: Integral b0 => b0 -> (a, b, c, d) -> (a, b, c, d) #

Semigroup (f p) => Semigroup (M1 i c f p)

Since: base-4.12.0.0

Instance details

Defined in GHC.Generics

Methods

(<>) :: M1 i c f p -> M1 i c f p -> M1 i c f p #

sconcat :: NonEmpty (M1 i c f p) -> M1 i c f p #

stimes :: Integral b => b -> M1 i c f p -> M1 i c f p #

Semigroup (f (g p)) => Semigroup ((f :.: g) p)

Since: base-4.12.0.0

Instance details

Defined in GHC.Generics

Methods

(<>) :: (f :.: g) p -> (f :.: g) p -> (f :.: g) p #

sconcat :: NonEmpty ((f :.: g) p) -> (f :.: g) p #

stimes :: Integral b => b -> (f :.: g) p -> (f :.: g) p #

(Semigroup a, Semigroup b, Semigroup c, Semigroup d, Semigroup e) => Semigroup (a, b, c, d, e)

Since: base-4.9.0.0

Instance details

Defined in GHC.Base

Methods

(<>) :: (a, b, c, d, e) -> (a, b, c, d, e) -> (a, b, c, d, e) #

sconcat :: NonEmpty (a, b, c, d, e) -> (a, b, c, d, e) #

stimes :: Integral b0 => b0 -> (a, b, c, d, e) -> (a, b, c, d, e) #

Semigroup (f (g a)) => Semigroup (Compose f g a) 
Instance details

Defined in Data.Vinyl.Functor

Methods

(<>) :: Compose f g a -> Compose f g a -> Compose f g a #

sconcat :: NonEmpty (Compose f g a) -> Compose f g a #

stimes :: Integral b => b -> Compose f g a -> Compose f g a #

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:

Right identity
x <> mempty = x
Left identity
mempty <> x = x
Associativity
x <> (y <> z) = (x <> y) <> z (Semigroup law)
Concatenation
mconcat = foldr (<>) mempty

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

Instances details
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 ByteString 
Instance details

Defined in Data.ByteString.Internal

Monoid ByteString 
Instance details

Defined in Data.ByteString.Lazy.Internal

Monoid Builder 
Instance details

Defined in Data.ByteString.Builder.Internal

Monoid More 
Instance details

Defined in Data.Attoparsec.Internal.Types

Methods

mempty :: More #

mappend :: More -> More -> More #

mconcat :: [More] -> More #

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 String 
Instance details

Defined in Basement.UTF8.Base

Monoid IntSet 
Instance details

Defined in Data.IntSet.Internal

Monoid MText 
Instance details

Defined in Michelson.Text

Methods

mempty :: MText #

mappend :: MText -> MText -> MText #

mconcat :: [MText] -> MText #

Monoid ContractDoc 
Instance details

Defined in Michelson.Doc

Monoid AnalyzerRes 
Instance details

Defined in Michelson.Analyzer

Monoid AnnotationSet 
Instance details

Defined in Michelson.Untyped.Annotation

Monoid VarAnn 
Instance details

Defined in Michelson.Untyped.Annotation

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 DocCollector 
Instance details

Defined in Lorentz.UStore.Doc

Methods

mempty :: DocCollector #

mappend :: DocCollector -> DocCollector -> DocCollector #

mconcat :: [DocCollector] -> DocCollector #

a :=> (Monoid (Dict a)) 
Instance details

Defined in Data.Constraint

Methods

ins :: a :- Monoid (Dict a) #

() :=> (Monoid [a]) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Monoid [a] #

() :=> (Monoid Ordering) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Monoid Ordering #

() :=> (Monoid ()) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Monoid () #

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 #

Monoid (IResult a) 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

mempty :: IResult a #

mappend :: IResult a -> IResult a -> IResult a #

mconcat :: [IResult a] -> IResult a #

Monoid (Result a) 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

mempty :: Result a #

mappend :: Result a -> Result a -> Result a #

mconcat :: [Result a] -> Result a #

Monoid (Parser a) 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

mempty :: Parser a #

mappend :: Parser a -> Parser a -> Parser a #

mconcat :: [Parser a] -> Parser a #

(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 #

PrimType ty => Monoid (UArray ty) 
Instance details

Defined in Basement.UArray.Base

Methods

mempty :: UArray ty #

mappend :: UArray ty -> UArray ty -> UArray ty #

mconcat :: [UArray ty] -> UArray ty #

PrimType ty => Monoid (Block ty) 
Instance details

Defined in Basement.Block.Base

Methods

mempty :: Block ty #

mappend :: Block ty -> Block ty -> Block ty #

mconcat :: [Block ty] -> Block ty #

Monoid (CountOf ty) 
Instance details

Defined in Basement.Types.OffsetSize

Methods

mempty :: CountOf ty #

mappend :: CountOf ty -> CountOf ty -> CountOf ty #

mconcat :: [CountOf ty] -> CountOf ty #

a => Monoid (Dict a) 
Instance details

Defined in Data.Constraint

Methods

mempty :: Dict a #

mappend :: Dict a -> Dict a -> Dict a #

mconcat :: [Dict a] -> Dict 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 #

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 #

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 #

(Hashable a, Eq a) => Monoid (HashSet a) 
Instance details

Defined in Data.HashSet.Base

Methods

mempty :: HashSet a #

mappend :: HashSet a -> HashSet a -> HashSet a #

mconcat :: [HashSet a] -> HashSet 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 (UStore a) 
Instance details

Defined in Lorentz.UStore.Types

Methods

mempty :: UStore a #

mappend :: UStore a -> UStore a -> UStore a #

mconcat :: [UStore a] -> UStore a #

Monoid a => Monoid (May a) 
Instance details

Defined in Lens.Micro.Mtl.Internal

Methods

mempty :: May a #

mappend :: May a -> May a -> May a #

mconcat :: [May a] -> May a #

Monoid (PrintComment st) 
Instance details

Defined in Michelson.Typed.Instr

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 #

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 #

(KnownSymbol s, Monoid t) => Monoid (ElField '(s, t)) 
Instance details

Defined in Data.Vinyl.Functor

Methods

mempty :: ElField '(s, t) #

mappend :: ElField '(s, t) -> ElField '(s, t) -> ElField '(s, t) #

mconcat :: [ElField '(s, t)] -> ElField '(s, t) #

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 #

Class (Semigroup a) (Monoid a) 
Instance details

Defined in Data.Constraint

Methods

cls :: Monoid a :- Semigroup a #

(Monoid a) :=> (Monoid (Maybe a)) 
Instance details

Defined in Data.Constraint

Methods

ins :: Monoid a :- Monoid (Maybe a) #

(Monoid a) :=> (Monoid (Const a b)) 
Instance details

Defined in Data.Constraint

Methods

ins :: Monoid a :- Monoid (Const a b) #

(Monoid a) :=> (Monoid (Identity a)) 
Instance details

Defined in Data.Constraint

Methods

ins :: Monoid a :- Monoid (Identity a) #

(Monoid a) :=> (Monoid (IO a)) 
Instance details

Defined in Data.Constraint

Methods

ins :: Monoid a :- Monoid (IO a) #

(Monoid a) :=> (Applicative ((,) a)) 
Instance details

Defined in Data.Constraint

Methods

ins :: Monoid a :- Applicative ((,) a) #

(Monoid a) :=> (Applicative (Const a :: Type -> Type)) 
Instance details

Defined in Data.Constraint

Methods

ins :: Monoid a :- Applicative (Const 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) #

(Eq k, Hashable k) => Monoid (HashMap k v) 
Instance details

Defined in Data.HashMap.Base

Methods

mempty :: HashMap k v #

mappend :: HashMap k v -> HashMap k v -> HashMap k v #

mconcat :: [HashMap k v] -> HashMap k v #

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 (Parser i a) 
Instance details

Defined in Data.Attoparsec.Internal.Types

Methods

mempty :: Parser i a #

mappend :: Parser i a -> Parser i a -> Parser i a #

mconcat :: [Parser i a] -> Parser i a #

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 #

Monoid (ReifiedFold s a) 
Instance details

Defined in Control.Lens.Reified

Methods

mempty :: ReifiedFold s a #

mappend :: ReifiedFold s a -> ReifiedFold s a -> ReifiedFold s a #

mconcat :: [ReifiedFold s a] -> ReifiedFold s a #

Monoid (f a) => Monoid (Indexing f a)
>>> "cat" ^@.. (folded <> folded)
[(0,'c'),(1,'a'),(2,'t'),(0,'c'),(1,'a'),(2,'t')]
>>> "cat" ^@.. indexing (folded <> folded)
[(0,'c'),(1,'a'),(2,'t'),(3,'c'),(4,'a'),(5,'t')]
Instance details

Defined in Control.Lens.Internal.Indexed

Methods

mempty :: Indexing f a #

mappend :: Indexing f a -> Indexing f a -> Indexing f a #

mconcat :: [Indexing f a] -> Indexing f a #

Monoid (s :-> s) 
Instance details

Defined in Lorentz.Base

Methods

mempty :: s :-> s #

mappend :: (s :-> s) -> (s :-> s) -> s :-> s #

mconcat :: [s :-> s] -> s :-> s #

Ord k => Monoid (BigMap k v) 
Instance details

Defined in Michelson.Typed.Haskell.Value

Methods

mempty :: BigMap k v #

mappend :: BigMap k v -> BigMap k v -> BigMap k v #

mconcat :: [BigMap k v] -> BigMap k v #

(Stream s, Ord e) => Monoid (ParseError s e) 
Instance details

Defined in Text.Megaparsec.Error

Methods

mempty :: ParseError s e #

mappend :: ParseError s e -> ParseError s e -> ParseError s e #

mconcat :: [ParseError s e] -> ParseError s e #

Monoid a => Monoid (Err e a) 
Instance details

Defined in Lens.Micro.Mtl.Internal

Methods

mempty :: Err e a #

mappend :: Err e a -> Err e a -> Err e a #

mconcat :: [Err e a] -> Err e a #

Monoid (Instr s s) 
Instance details

Defined in Michelson.Typed.Instr

Methods

mempty :: Instr s s #

mappend :: Instr s s -> Instr s s -> Instr s s #

mconcat :: [Instr s s] -> Instr s s #

Applicative f => Monoid (Traversed a f) 
Instance details

Defined in Lens.Micro

Methods

mempty :: Traversed a f #

mappend :: Traversed a f -> Traversed a f -> Traversed a f #

mconcat :: [Traversed a f] -> Traversed a f #

(Monoid a, Monoid b) :=> (Monoid (a, b)) 
Instance details

Defined in Data.Constraint

Methods

ins :: (Monoid a, Monoid b) :- Monoid (a, b) #

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 (ReifiedIndexedFold i s a) 
Instance details

Defined in Control.Lens.Reified

Monoid (Rec f ('[] :: [u])) 
Instance details

Defined in Data.Vinyl.Core

Methods

mempty :: Rec f '[] #

mappend :: Rec f '[] -> Rec f '[] -> Rec f '[] #

mconcat :: [Rec f '[]] -> Rec f '[] #

(Monoid (f r), Monoid (Rec f rs)) => Monoid (Rec f (r ': rs)) 
Instance details

Defined in Data.Vinyl.Core

Methods

mempty :: Rec f (r ': rs) #

mappend :: Rec f (r ': rs) -> Rec f (r ': rs) -> Rec f (r ': rs) #

mconcat :: [Rec f (r ': rs)] -> Rec f (r ': rs) #

(Monad m, Monoid r) => Monoid (Effect m r a) 
Instance details

Defined in Lens.Micro.Mtl.Internal

Methods

mempty :: Effect m r a #

mappend :: Effect m r a -> Effect m r a -> Effect m r a #

mconcat :: [Effect m r a] -> Effect m r a #

Reifies s (ReifiedMonoid a) => Monoid (ReflectedMonoid a s) 
Instance details

Defined in Data.Reflection

(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) #

Monoid (f (g a)) => Monoid (Compose f g a) 
Instance details

Defined in Data.Vinyl.Functor

Methods

mempty :: Compose f g a #

mappend :: Compose f g a -> Compose f g a -> Compose f g a #

mconcat :: [Compose f g a] -> Compose f g a #

data Bool #

Constructors

False 
True 

Instances

Instances details
Bounded Bool

Since: base-2.1

Instance details

Defined in GHC.Enum

Enum Bool

Since: base-2.1

Instance details

Defined in GHC.Enum

Methods

succ :: Bool -> Bool #

pred :: Bool -> Bool #

toEnum :: Int -> Bool #

fromEnum :: Bool -> Int #

enumFrom :: Bool -> [Bool] #

enumFromThen :: Bool -> Bool -> [Bool] #

enumFromTo :: Bool -> Bool -> [Bool] #

enumFromThenTo :: Bool -> Bool -> Bool -> [Bool] #

Eq Bool 
Instance details

Defined in GHC.Classes

Methods

(==) :: Bool -> Bool -> Bool #

(/=) :: Bool -> Bool -> Bool #

Data Bool

Since: base-4.0.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Bool -> c Bool #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Bool #

toConstr :: Bool -> Constr #

dataTypeOf :: Bool -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Bool) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Bool) #

gmapT :: (forall b. Data b => b -> b) -> Bool -> Bool #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Bool -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Bool -> r #

gmapQ :: (forall d. Data d => d -> u) -> Bool -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Bool -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Bool -> m Bool #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Bool -> m Bool #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Bool -> m Bool #

Ord Bool 
Instance details

Defined in GHC.Classes

Methods

compare :: Bool -> Bool -> Ordering #

(<) :: Bool -> Bool -> Bool #

(<=) :: Bool -> Bool -> Bool #

(>) :: Bool -> Bool -> Bool #

(>=) :: Bool -> Bool -> Bool #

max :: Bool -> Bool -> Bool #

min :: Bool -> Bool -> Bool #

Read Bool

Since: base-2.1

Instance details

Defined in GHC.Read

Show Bool

Since: base-2.1

Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> Bool -> ShowS #

show :: Bool -> String #

showList :: [Bool] -> ShowS #

Generic Bool

Since: base-4.6.0.0

Instance details

Defined in GHC.Generics

Associated Types

type Rep Bool :: Type -> Type #

Methods

from :: Bool -> Rep Bool x #

to :: Rep Bool x -> Bool #

Lift Bool 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

lift :: Bool -> Q Exp #

Hashable Bool 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Bool -> Int #

hash :: Bool -> Int #

SingKind Bool

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Associated Types

type DemoteRep Bool

Methods

fromSing :: forall (a :: Bool). Sing a -> DemoteRep Bool

Storable Bool

Since: base-2.1

Instance details

Defined in Foreign.Storable

Methods

sizeOf :: Bool -> Int #

alignment :: Bool -> Int #

peekElemOff :: Ptr Bool -> Int -> IO Bool #

pokeElemOff :: Ptr Bool -> Int -> Bool -> IO () #

peekByteOff :: Ptr b -> Int -> IO Bool #

pokeByteOff :: Ptr b -> Int -> Bool -> IO () #

peek :: Ptr Bool -> IO Bool #

poke :: Ptr Bool -> Bool -> IO () #

Bits Bool

Interpret Bool as 1-bit bit-field

Since: base-4.7.0.0

Instance details

Defined in Data.Bits

FiniteBits Bool

Since: base-4.7.0.0

Instance details

Defined in Data.Bits

NFData Bool 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Bool -> () #

Unbox Bool 
Instance details

Defined in Data.Vector.Unboxed.Base

HasAnnotation Bool 
Instance details

Defined in Lorentz.Annotation

IsoValue Bool 
Instance details

Defined in Michelson.Typed.Haskell.Value

Associated Types

type ToT Bool :: T #

Methods

toVal :: Bool -> Value (ToT Bool) #

fromVal :: Value (ToT Bool) -> Bool #

TypeHasDoc Bool 
Instance details

Defined in Michelson.Typed.Haskell.Doc

PShow Bool 
Instance details

Defined in Data.Singletons.Prelude.Show

Associated Types

type ShowsPrec arg0 arg1 arg2 :: Symbol #

type Show_ arg0 :: Symbol #

type ShowList arg0 arg1 :: Symbol #

SShow Bool 
Instance details

Defined in Data.Singletons.Prelude.Show

Methods

sShowsPrec :: forall (t1 :: Nat) (t2 :: Bool) (t3 :: Symbol). Sing t1 -> Sing t2 -> Sing t3 -> Sing (Apply (Apply (Apply ShowsPrecSym0 t1) t2) t3) #

sShow_ :: forall (t :: Bool). Sing t -> Sing (Apply Show_Sym0 t) #

sShowList :: forall (t1 :: [Bool]) (t2 :: Symbol). Sing t1 -> Sing t2 -> Sing (Apply (Apply ShowListSym0 t1) t2) #

PEnum Bool 
Instance details

Defined in Data.Singletons.Prelude.Enum

Associated Types

type Succ arg0 :: a0 #

type Pred arg0 :: a0 #

type ToEnum arg0 :: a0 #

type FromEnum arg0 :: Nat #

type EnumFromTo arg0 arg1 :: [a0] #

type EnumFromThenTo arg0 arg1 arg2 :: [a0] #

SEnum Bool 
Instance details

Defined in Data.Singletons.Prelude.Enum

Methods

sSucc :: forall (t :: Bool). Sing t -> Sing (Apply SuccSym0 t) #

sPred :: forall (t :: Bool). Sing t -> Sing (Apply PredSym0 t) #

sToEnum :: forall (t :: Nat). Sing t -> Sing (Apply ToEnumSym0 t) #

sFromEnum :: forall (t :: Bool). Sing t -> Sing (Apply FromEnumSym0 t) #

sEnumFromTo :: forall (t1 :: Bool) (t2 :: Bool). Sing t1 -> Sing t2 -> Sing (Apply (Apply EnumFromToSym0 t1) t2) #

sEnumFromThenTo :: forall (t1 :: Bool) (t2 :: Bool) (t3 :: Bool). Sing t1 -> Sing t2 -> Sing t3 -> Sing (Apply (Apply (Apply EnumFromThenToSym0 t1) t2) t3) #

PBounded Bool 
Instance details

Defined in Data.Singletons.Prelude.Enum

Associated Types

type MinBound :: a0 #

type MaxBound :: a0 #

SBounded Bool 
Instance details

Defined in Data.Singletons.Prelude.Enum

POrd Bool 
Instance details

Defined in Data.Singletons.Prelude.Ord

Associated Types

type Compare arg0 arg1 :: Ordering #

type arg0 < arg1 :: Bool #

type arg0 <= arg1 :: Bool #

type arg0 > arg1 :: Bool #

type arg0 >= arg1 :: Bool #

type Max arg0 arg1 :: a0 #

type Min arg0 arg1 :: a0 #

SOrd Bool 
Instance details

Defined in Data.Singletons.Prelude.Ord

Methods

sCompare :: forall (t1 :: Bool) (t2 :: Bool). Sing t1 -> Sing t2 -> Sing (Apply (Apply CompareSym0 t1) t2) #

(%<) :: forall (t1 :: Bool) (t2 :: Bool). Sing t1 -> Sing t2 -> Sing (Apply (Apply (<@#@$) t1) t2) #

(%<=) :: forall (t1 :: Bool) (t2 :: Bool). Sing t1 -> Sing t2 -> Sing (Apply (Apply (<=@#@$) t1) t2) #

(%>) :: forall (t1 :: Bool) (t2 :: Bool). Sing t1 -> Sing t2 -> Sing (Apply (Apply (>@#@$) t1) t2) #

(%>=) :: forall (t1 :: Bool) (t2 :: Bool). Sing t1 -> Sing t2 -> Sing (Apply (Apply (>=@#@$) t1) t2) #

sMax :: forall (t1 :: Bool) (t2 :: Bool). Sing t1 -> Sing t2 -> Sing (Apply (Apply MaxSym0 t1) t2) #

sMin :: forall (t1 :: Bool) (t2 :: Bool). Sing t1 -> Sing t2 -> Sing (Apply (Apply MinSym0 t1) t2) #

SEq Bool 
Instance details

Defined in Data.Singletons.Prelude.Eq

Methods

(%==) :: forall (a :: Bool) (b :: Bool). Sing a -> Sing b -> Sing (a == b) #

(%/=) :: forall (a :: Bool) (b :: Bool). Sing a -> Sing b -> Sing (a /= b) #

PEq Bool 
Instance details

Defined in Data.Singletons.Prelude.Eq

Associated Types

type x == y :: Bool #

type x /= y :: Bool #

SingI 'False

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

sing :: Sing 'False

SingI 'True

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

sing :: Sing 'True

TestCoercion SBool 
Instance details

Defined in Data.Singletons.Prelude.Instances

Methods

testCoercion :: forall (a :: k) (b :: k). SBool a -> SBool b -> Maybe (Coercion a b) #

TestEquality SBool 
Instance details

Defined in Data.Singletons.Prelude.Instances

Methods

testEquality :: forall (a :: k) (b :: k). SBool a -> SBool b -> Maybe (a :~: b) #

Vector Vector Bool 
Instance details

Defined in Data.Vector.Unboxed.Base

UnaryArithOpHs Not Bool 
Instance details

Defined in Lorentz.Arith

Associated Types

type UnaryArithResHs Not Bool #

MVector MVector Bool 
Instance details

Defined in Data.Vector.Unboxed.Base

ArithOpHs Or Bool Bool 
Instance details

Defined in Lorentz.Arith

Associated Types

type ArithResHs Or Bool Bool #

ArithOpHs And Bool Bool 
Instance details

Defined in Lorentz.Arith

Associated Types

type ArithResHs And Bool Bool #

ArithOpHs Xor Bool Bool 
Instance details

Defined in Lorentz.Arith

Associated Types

type ArithResHs Xor Bool Bool #

() :=> (Bounded Bool) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Bounded Bool #

() :=> (Enum Bool) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Enum Bool #

() :=> (Eq Bool) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Eq Bool #

() :=> (Ord Bool) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Ord Bool #

() :=> (Read Bool) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Read Bool #

() :=> (Show Bool) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Show Bool #

() :=> (Bits Bool) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Bits Bool #

SingI NotSym0 
Instance details

Defined in Data.Singletons.Prelude.Bool

Methods

sing :: Sing NotSym0 #

SingI (||@#@$) 
Instance details

Defined in Data.Singletons.Prelude.Bool

Methods

sing :: Sing (||@#@$) #

SingI (&&@#@$) 
Instance details

Defined in Data.Singletons.Prelude.Bool

Methods

sing :: Sing (&&@#@$) #

SingI (<=?@#@$) 
Instance details

Defined in Data.Singletons.TypeLits.Internal

Methods

sing :: Sing (<=?@#@$) #

SingI AllSym0 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

Methods

sing :: Sing AllSym0 #

SingI AnySym0 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

Methods

sing :: Sing AnySym0 #

SingI ShowParenSym0 
Instance details

Defined in Data.Singletons.Prelude.Show

SingI OrSym0 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing OrSym0 #

SingI AndSym0 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing AndSym0 #

SuppressUnusedWarnings NotSym0 
Instance details

Defined in Data.Singletons.Prelude.Bool

SuppressUnusedWarnings FromEnum_6989586621680152586Sym0 
Instance details

Defined in Data.Singletons.Prelude.Enum

SuppressUnusedWarnings AllSym0 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings All_Sym0 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings AnySym0 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings Any_Sym0 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (||@#@$) 
Instance details

Defined in Data.Singletons.Prelude.Bool

SuppressUnusedWarnings (&&@#@$) 
Instance details

Defined in Data.Singletons.Prelude.Bool

SuppressUnusedWarnings Compare_6989586621679803720Sym0 
Instance details

Defined in Data.Singletons.Prelude.Ord

SuppressUnusedWarnings ShowParenSym0 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings OrSym0 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings AndSym0 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings ToEnum_6989586621680152573Sym0 
Instance details

Defined in Data.Singletons.Prelude.Enum

SuppressUnusedWarnings ShowsPrec_6989586621680595859Sym0 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (<=?@#@$) 
Instance details

Defined in Data.Singletons.TypeLits.Internal

SuppressUnusedWarnings GetAllSym0 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings GetAnySym0 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SingI x => SingI ((||@#@$$) x :: TyFun Bool Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Bool

Methods

sing :: Sing ((||@#@$$) x) #

SingI x => SingI ((&&@#@$$) x :: TyFun Bool Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Bool

Methods

sing :: Sing ((&&@#@$$) x) #

SingI x => SingI ((<=?@#@$$) x :: TyFun Nat Bool -> Type) 
Instance details

Defined in Data.Singletons.TypeLits.Internal

Methods

sing :: Sing ((<=?@#@$$) x) #

SAlternative f => SingI (GuardSym0 :: TyFun Bool (f ()) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

Methods

sing :: Sing GuardSym0 #

SApplicative f => SingI (WhenSym0 :: TyFun Bool (f () ~> f ()) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

Methods

sing :: Sing WhenSym0 #

SApplicative f => SingI (UnlessSym0 :: TyFun Bool (f () ~> f ()) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad

Methods

sing :: Sing UnlessSym0 #

SingI (ListnullSym0 :: TyFun [a] Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

Methods

sing :: Sing ListnullSym0 #

SEq a => SingI (ListisPrefixOfSym0 :: TyFun [a] ([a] ~> Bool) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

Methods

sing :: Sing ListisPrefixOfSym0 #

SingI (NullSym0 :: TyFun [a] Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing NullSym0 #

SEq a => SingI (IsSuffixOfSym0 :: TyFun [a] ([a] ~> Bool) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SEq a => SingI (IsPrefixOfSym0 :: TyFun [a] ([a] ~> Bool) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SEq a => SingI (IsInfixOfSym0 :: TyFun [a] ([a] ~> Bool) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

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 #

SEq a => SingI (ListelemSym0 :: TyFun a ([a] ~> Bool) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

Methods

sing :: Sing ListelemSym0 #

SEq a => SingI (NotElemSym0 :: TyFun a ([a] ~> Bool) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing NotElemSym0 #

SEq a => SingI (ElemSym0 :: TyFun a ([a] ~> Bool) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing ElemSym0 #

SFoldable t => SingI (OrSym0 :: TyFun (t Bool) Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

Methods

sing :: Sing OrSym0 #

SFoldable t => SingI (AndSym0 :: TyFun (t Bool) Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

Methods

sing :: Sing AndSym0 #

SEq a => SingI ((==@#@$) :: TyFun a (a ~> Bool) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Eq

Methods

sing :: Sing (==@#@$) #

SEq a => SingI ((/=@#@$) :: TyFun a (a ~> Bool) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Eq

Methods

sing :: Sing (/=@#@$) #

SingI (Bool_Sym0 :: TyFun a (a ~> (Bool ~> a)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Bool

Methods

sing :: Sing Bool_Sym0 #

SOrd a => SingI ((>@#@$) :: TyFun a (a ~> Bool) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

Methods

sing :: Sing (>@#@$) #

SOrd a => SingI ((>=@#@$) :: TyFun a (a ~> Bool) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

Methods

sing :: Sing (>=@#@$) #

SOrd a => SingI ((<@#@$) :: TyFun a (a ~> Bool) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

Methods

sing :: Sing (<@#@$) #

SOrd a => SingI ((<=@#@$) :: TyFun a (a ~> Bool) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

Methods

sing :: Sing (<=@#@$) #

SingI (ListtakeWhileSym0 :: TyFun (a ~> Bool) ([a] ~> [a]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

Methods

sing :: Sing ListtakeWhileSym0 #

SingI (ListspanSym0 :: TyFun (a ~> Bool) ([a] ~> ([a], [a])) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

Methods

sing :: Sing ListspanSym0 #

SingI (ListpartitionSym0 :: TyFun (a ~> Bool) ([a] ~> ([a], [a])) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

Methods

sing :: Sing ListpartitionSym0 #

SingI (ListnubBySym0 :: TyFun (a ~> (a ~> Bool)) ([a] ~> [a]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

Methods

sing :: Sing ListnubBySym0 #

SingI (ListfilterSym0 :: TyFun (a ~> Bool) ([a] ~> [a]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

Methods

sing :: Sing ListfilterSym0 #

SingI (ListdropWhileSym0 :: TyFun (a ~> Bool) ([a] ~> [a]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

Methods

sing :: Sing ListdropWhileSym0 #

SingI (UnionBySym0 :: TyFun (a ~> (a ~> Bool)) ([a] ~> ([a] ~> [a])) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SingI (TakeWhileSym0 :: TyFun (a ~> Bool) ([a] ~> [a]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SingI (SpanSym0 :: TyFun (a ~> Bool) ([a] ~> ([a], [a])) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing SpanSym0 #

SingI (SelectSym0 :: TyFun (a ~> Bool) (a ~> (([a], [a]) ~> ([a], [a]))) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing SelectSym0 #

SingI (PartitionSym0 :: TyFun (a ~> Bool) ([a] ~> ([a], [a])) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SingI (NubBySym0 :: TyFun (a ~> (a ~> Bool)) ([a] ~> [a]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing NubBySym0 #

SingI (IntersectBySym0 :: TyFun (a ~> (a ~> Bool)) ([a] ~> ([a] ~> [a])) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SingI (GroupBySym0 :: TyFun (a ~> (a ~> Bool)) ([a] ~> [[a]]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SingI (FindSym0 :: TyFun (a ~> Bool) ([a] ~> Maybe a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing FindSym0 #

SingI (FindIndicesSym0 :: TyFun (a ~> Bool) ([a] ~> [Nat]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SingI (FindIndexSym0 :: TyFun (a ~> Bool) ([a] ~> Maybe Nat) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SingI (FilterSym0 :: TyFun (a ~> Bool) ([a] ~> [a]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing FilterSym0 #

SingI (Elem_bySym0 :: TyFun (a ~> (a ~> Bool)) (a ~> ([a] ~> Bool)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing Elem_bySym0 #

SingI (DropWhileSym0 :: TyFun (a ~> Bool) ([a] ~> [a]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SingI (DropWhileEndSym0 :: TyFun (a ~> Bool) ([a] ~> [a]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SingI (DeleteFirstsBySym0 :: TyFun (a ~> (a ~> Bool)) ([a] ~> ([a] ~> [a])) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SingI (DeleteBySym0 :: TyFun (a ~> (a ~> Bool)) (a ~> ([a] ~> [a])) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SingI (BreakSym0 :: TyFun (a ~> Bool) ([a] ~> ([a], [a])) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing BreakSym0 #

SingI (AnySym0 :: TyFun (a ~> Bool) ([a] ~> Bool) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing AnySym0 #

SingI (AllSym0 :: TyFun (a ~> Bool) ([a] ~> Bool) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing AllSym0 #

SingI (UntilSym0 :: TyFun (a ~> Bool) ((a ~> a) ~> (a ~> a)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Base

Methods

sing :: Sing UntilSym0 #

SuppressUnusedWarnings ((||@#@$$) a6989586621679772157 :: TyFun Bool Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Bool

SuppressUnusedWarnings ((&&@#@$$) a6989586621679771912 :: TyFun Bool Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Bool

SuppressUnusedWarnings (Compare_6989586621679803720Sym1 a6989586621679803718 :: TyFun Bool Ordering -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

SuppressUnusedWarnings (GuardSym0 :: TyFun Bool (f6989586621679962724 ()) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

SuppressUnusedWarnings (ShowsPrec_6989586621680595859Sym1 a6989586621680595856 :: TyFun Bool (Symbol ~> Symbol) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (WhenSym0 :: TyFun Bool (f6989586621679962753 () ~> f6989586621679962753 ()) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

SuppressUnusedWarnings (UnlessSym0 :: TyFun Bool (f6989586621681401670 () ~> f6989586621681401670 ()) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad

SuppressUnusedWarnings (ListnullSym0 :: TyFun [a6989586621680686782] Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

SuppressUnusedWarnings (ListisPrefixOfSym0 :: TyFun [a6989586621680686805] ([a6989586621680686805] ~> Bool) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

SuppressUnusedWarnings (NullSym0 :: TyFun [a6989586621680316437] Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (IsSuffixOfSym0 :: TyFun [a6989586621680316402] ([a6989586621680316402] ~> Bool) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (IsPrefixOfSym0 :: TyFun [a6989586621680316403] ([a6989586621680316403] ~> Bool) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (IsInfixOfSym0 :: TyFun [a6989586621680316401] ([a6989586621680316401] ~> Bool) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (IsNothingSym0 :: TyFun (Maybe a6989586621679913399) Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Maybe

SuppressUnusedWarnings (IsJustSym0 :: TyFun (Maybe a6989586621679913400) Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Maybe

SuppressUnusedWarnings ((<=?@#@$$) a3530822107858468865 :: TyFun Nat Bool -> Type) 
Instance details

Defined in Data.Singletons.TypeLits.Internal

SuppressUnusedWarnings (ListelemSym0 :: TyFun a6989586621680686793 ([a6989586621680686793] ~> Bool) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

SuppressUnusedWarnings (NotElemSym0 :: TyFun a6989586621680316399 ([a6989586621680316399] ~> Bool) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (ElemSym0 :: TyFun a6989586621680316400 ([a6989586621680316400] ~> Bool) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (OrSym0 :: TyFun (t6989586621680742301 Bool) Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (Let6989586621680742866Scrutinee_6989586621680742628Sym0 :: TyFun (t6989586621680742381 Bool) All -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (Let6989586621680742857Scrutinee_6989586621680742630Sym0 :: TyFun (t6989586621680742381 Bool) Any -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (Let6989586621680734318Scrutinee_6989586621680734256Sym0 :: TyFun k1 (TyFun k1 Bool -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (Let6989586621680734291Scrutinee_6989586621680734254Sym0 :: TyFun k1 (TyFun k1 Bool -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (AndSym0 :: TyFun (t6989586621680742302 Bool) Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (DefaultEqSym0 :: TyFun k6989586621679774969 (k6989586621679774969 ~> Bool) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Eq

SuppressUnusedWarnings ((==@#@$) :: TyFun a6989586621679774975 (a6989586621679774975 ~> Bool) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Eq

SuppressUnusedWarnings ((/=@#@$) :: TyFun a6989586621679774975 (a6989586621679774975 ~> Bool) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Eq

SuppressUnusedWarnings (Bool_Sym0 :: TyFun a6989586621679771144 (a6989586621679771144 ~> (Bool ~> a6989586621679771144)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Bool

SuppressUnusedWarnings (TFHelper_6989586621679792578Sym0 :: TyFun a6989586621679792381 (a6989586621679792381 ~> Bool) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

SuppressUnusedWarnings (TFHelper_6989586621679792560Sym0 :: TyFun a6989586621679792381 (a6989586621679792381 ~> Bool) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

SuppressUnusedWarnings (TFHelper_6989586621679792542Sym0 :: TyFun a6989586621679792381 (a6989586621679792381 ~> Bool) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

SuppressUnusedWarnings (TFHelper_6989586621679792524Sym0 :: TyFun a6989586621679792381 (a6989586621679792381 ~> Bool) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

SuppressUnusedWarnings (Let6989586621679792622Scrutinee_6989586621679792413Sym0 :: TyFun k1 (TyFun k1 Bool -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

SuppressUnusedWarnings (Let6989586621679792604Scrutinee_6989586621679792411Sym0 :: TyFun k1 (TyFun k1 Bool -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

SuppressUnusedWarnings (Let6989586621679792513Scrutinee_6989586621679792401Sym0 :: TyFun k1 (TyFun k1 Bool -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

SuppressUnusedWarnings (Let6989586621679792508Scrutinee_6989586621679792399Sym0 :: TyFun k1 (TyFun k1 Bool -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

SuppressUnusedWarnings ((>@#@$) :: TyFun a6989586621679792381 (a6989586621679792381 ~> Bool) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

SuppressUnusedWarnings ((>=@#@$) :: TyFun a6989586621679792381 (a6989586621679792381 ~> Bool) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

SuppressUnusedWarnings ((<@#@$) :: TyFun a6989586621679792381 (a6989586621679792381 ~> Bool) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

SuppressUnusedWarnings ((<=@#@$) :: TyFun a6989586621679792381 (a6989586621679792381 ~> Bool) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

SuppressUnusedWarnings (Elem_6989586621680921217Sym0 :: TyFun a6989586621680742398 (Identity a6989586621680742398 ~> Bool) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Identity

SuppressUnusedWarnings (Null_6989586621680921344Sym0 :: TyFun (Identity a6989586621680742396) Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Identity

SuppressUnusedWarnings (ListtakeWhileSym0 :: TyFun (a6989586621680686811 ~> Bool) ([a6989586621680686811] ~> [a6989586621680686811]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

SuppressUnusedWarnings (ListspanSym0 :: TyFun (a6989586621680686809 ~> Bool) ([a6989586621680686809] ~> ([a6989586621680686809], [a6989586621680686809])) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

SuppressUnusedWarnings (ListpartitionSym0 :: TyFun (a6989586621680686807 ~> Bool) ([a6989586621680686807] ~> ([a6989586621680686807], [a6989586621680686807])) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

SuppressUnusedWarnings (ListnubBySym0 :: TyFun (a6989586621680686799 ~> (a6989586621680686799 ~> Bool)) ([a6989586621680686799] ~> [a6989586621680686799]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

SuppressUnusedWarnings (ListfilterSym0 :: TyFun (a6989586621680686808 ~> Bool) ([a6989586621680686808] ~> [a6989586621680686808]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

SuppressUnusedWarnings (ListdropWhileSym0 :: TyFun (a6989586621680686810 ~> Bool) ([a6989586621680686810] ~> [a6989586621680686810]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

SuppressUnusedWarnings (UnionBySym0 :: TyFun (a6989586621680316316 ~> (a6989586621680316316 ~> Bool)) ([a6989586621680316316] ~> ([a6989586621680316316] ~> [a6989586621680316316])) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (TakeWhileSym0 :: TyFun (a6989586621680316343 ~> Bool) ([a6989586621680316343] ~> [a6989586621680316343]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (SpanSym0 :: TyFun (a6989586621680316340 ~> Bool) ([a6989586621680316340] ~> ([a6989586621680316340], [a6989586621680316340])) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (SelectSym0 :: TyFun (a6989586621680316326 ~> Bool) (a6989586621680316326 ~> (([a6989586621680316326], [a6989586621680316326]) ~> ([a6989586621680316326], [a6989586621680316326]))) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (PartitionSym0 :: TyFun (a6989586621680316327 ~> Bool) ([a6989586621680316327] ~> ([a6989586621680316327], [a6989586621680316327])) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (NubBySym0 :: TyFun (a6989586621680316318 ~> (a6989586621680316318 ~> Bool)) ([a6989586621680316318] ~> [a6989586621680316318]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (Let6989586621680320723ZsSym0 :: TyFun (k ~> Bool) (TyFun k (TyFun [k] [k] -> Type) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (Let6989586621680320723YsSym0 :: TyFun (k ~> Bool) (TyFun k (TyFun [k] [k] -> Type) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (Let6989586621680320723X_6989586621680320724Sym0 :: TyFun (k ~> Bool) (TyFun k (TyFun [k] ([k], [k]) -> Type) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (Let6989586621680320680ZsSym0 :: TyFun (k ~> Bool) (TyFun k (TyFun [k] [k] -> Type) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (Let6989586621680320680YsSym0 :: TyFun (k ~> Bool) (TyFun k (TyFun [k] [k] -> Type) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (Let6989586621680320680X_6989586621680320681Sym0 :: TyFun (k ~> Bool) (TyFun k (TyFun [k] ([k], [k]) -> Type) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (IntersectBySym0 :: TyFun (a6989586621680316344 ~> (a6989586621680316344 ~> Bool)) ([a6989586621680316344] ~> ([a6989586621680316344] ~> [a6989586621680316344])) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (GroupBySym0 :: TyFun (a6989586621680316330 ~> (a6989586621680316330 ~> Bool)) ([a6989586621680316330] ~> [[a6989586621680316330]]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (FindSym0 :: TyFun (a6989586621680316350 ~> Bool) ([a6989586621680316350] ~> Maybe a6989586621680316350) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (FindIndicesSym0 :: TyFun (a6989586621680316346 ~> Bool) ([a6989586621680316346] ~> [Nat]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (FindIndexSym0 :: TyFun (a6989586621680316347 ~> Bool) ([a6989586621680316347] ~> Maybe Nat) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (FilterSym0 :: TyFun (a6989586621680316351 ~> Bool) ([a6989586621680316351] ~> [a6989586621680316351]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (Elem_bySym0 :: TyFun (a6989586621680316317 ~> (a6989586621680316317 ~> Bool)) (a6989586621680316317 ~> ([a6989586621680316317] ~> Bool)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (DropWhileSym0 :: TyFun (a6989586621680316342 ~> Bool) ([a6989586621680316342] ~> [a6989586621680316342]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (DropWhileEndSym0 :: TyFun (a6989586621680316341 ~> Bool) ([a6989586621680316341] ~> [a6989586621680316341]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (DeleteFirstsBySym0 :: TyFun (a6989586621680316356 ~> (a6989586621680316356 ~> Bool)) ([a6989586621680316356] ~> ([a6989586621680316356] ~> [a6989586621680316356])) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (DeleteBySym0 :: TyFun (a6989586621680316357 ~> (a6989586621680316357 ~> Bool)) (a6989586621680316357 ~> ([a6989586621680316357] ~> [a6989586621680316357])) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (BreakSym0 :: TyFun (a6989586621680316339 ~> Bool) ([a6989586621680316339] ~> ([a6989586621680316339], [a6989586621680316339])) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (AnySym0 :: TyFun (a6989586621680316420 ~> Bool) ([a6989586621680316420] ~> Bool) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (AllSym0 :: TyFun (a6989586621680316421 ~> Bool) ([a6989586621680316421] ~> Bool) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (UntilSym0 :: TyFun (a6989586621679941593 ~> Bool) ((a6989586621679941593 ~> a6989586621679941593) ~> (a6989586621679941593 ~> a6989586621679941593)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Base

(SEq a, SingI d) => SingI (ListisPrefixOfSym1 d :: TyFun [a] Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

Methods

sing :: Sing (ListisPrefixOfSym1 d) #

(SEq a, SingI d) => SingI (ListelemSym1 d :: TyFun [a] Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

Methods

sing :: Sing (ListelemSym1 d) #

(SEq a, SingI d) => SingI (NotElemSym1 d :: TyFun [a] Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing (NotElemSym1 d) #

(SEq a, SingI d) => SingI (IsSuffixOfSym1 d :: TyFun [a] Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing (IsSuffixOfSym1 d) #

(SEq a, SingI d) => SingI (IsPrefixOfSym1 d :: TyFun [a] Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing (IsPrefixOfSym1 d) #

(SEq a, SingI d) => SingI (IsInfixOfSym1 d :: TyFun [a] Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing (IsInfixOfSym1 d) #

(SEq a, SingI d) => SingI (ElemSym1 d :: TyFun [a] Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing (ElemSym1 d) #

SingI d => SingI (AnySym1 d :: TyFun [a] Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing (AnySym1 d) #

SingI d => SingI (AllSym1 d :: TyFun [a] Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing (AllSym1 d) #

SingI (IsRightSym0 :: TyFun (Either a b) Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Either

SingI (IsLeftSym0 :: TyFun (Either a b) Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Either

Methods

sing :: Sing IsLeftSym0 #

SingI d => SingI (Elem_bySym1 d :: TyFun a ([a] ~> Bool) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing (Elem_bySym1 d) #

(SFoldable t, SEq a) => SingI (NotElemSym0 :: TyFun a (t a ~> Bool) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

(SFoldable t, SEq a) => SingI (ElemSym0 :: TyFun a (t a ~> Bool) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

Methods

sing :: Sing ElemSym0 #

(SEq a, SingI x) => SingI ((==@#@$$) x :: TyFun a Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Eq

Methods

sing :: Sing ((==@#@$$) x) #

(SEq a, SingI x) => SingI ((/=@#@$$) x :: TyFun a Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Eq

Methods

sing :: Sing ((/=@#@$$) x) #

SingI d => SingI (Bool_Sym1 d :: TyFun a (Bool ~> a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Bool

Methods

sing :: Sing (Bool_Sym1 d) #

(SOrd a, SingI d) => SingI ((>@#@$$) d :: TyFun a Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

Methods

sing :: Sing ((>@#@$$) d) #

(SOrd a, SingI d) => SingI ((>=@#@$$) d :: TyFun a Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

Methods

sing :: Sing ((>=@#@$$) d) #

(SOrd a, SingI d) => SingI ((<@#@$$) d :: TyFun a Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

Methods

sing :: Sing ((<@#@$$) d) #

(SOrd a, SingI d) => SingI ((<=@#@$$) d :: TyFun a Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

Methods

sing :: Sing ((<=@#@$$) d) #

SFoldable t => SingI (FindSym0 :: TyFun (a ~> Bool) (t a ~> Maybe a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

Methods

sing :: Sing FindSym0 #

SFoldable t => SingI (AnySym0 :: TyFun (a ~> Bool) (t a ~> Bool) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

Methods

sing :: Sing AnySym0 #

SFoldable t => SingI (AllSym0 :: TyFun (a ~> Bool) (t a ~> Bool) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

Methods

sing :: Sing AllSym0 #

SMonadPlus m => SingI (MfilterSym0 :: TyFun (a ~> Bool) (m a ~> m a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad

SApplicative m => SingI (FilterMSym0 :: TyFun (a ~> m Bool) ([a] ~> m [a]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad

SuppressUnusedWarnings (ListisPrefixOfSym1 a6989586621680687765 :: TyFun [a6989586621680686805] Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

SuppressUnusedWarnings (ListelemSym1 a6989586621680687700 :: TyFun [a6989586621680686793] Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

SuppressUnusedWarnings (NotElemSym1 a6989586621680321269 :: TyFun [a6989586621680316399] Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (IsSuffixOfSym1 a6989586621680321289 :: TyFun [a6989586621680316402] Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (IsPrefixOfSym1 a6989586621680321295 :: TyFun [a6989586621680316403] Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (IsInfixOfSym1 a6989586621680321283 :: TyFun [a6989586621680316401] Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (ElemSym1 a6989586621680321276 :: TyFun [a6989586621680316400] Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (AnySym1 a6989586621680321526 :: TyFun [a6989586621680316420] Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (AllSym1 a6989586621680321533 :: TyFun [a6989586621680316421] Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (IsRightSym0 :: TyFun (Either a6989586621680725232 b6989586621680725233) Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Either

SuppressUnusedWarnings (IsLeftSym0 :: TyFun (Either a6989586621680725234 b6989586621680725235) Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Either

SuppressUnusedWarnings (Let6989586621680320493Scrutinee_6989586621680317017Sym0 :: TyFun k1 (TyFun k Bool -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (Elem_bySym1 a6989586621680320412 :: TyFun a6989586621680316317 ([a6989586621680316317] ~> Bool) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (NotElemSym0 :: TyFun a6989586621680742292 (t6989586621680742291 a6989586621680742292 ~> Bool) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (Let6989586621680734318Scrutinee_6989586621680734256Sym1 x6989586621680734311 :: TyFun k1 Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (Let6989586621680734291Scrutinee_6989586621680734254Sym1 x6989586621680734284 :: TyFun k1 Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (Elem_6989586621680744088Sym0 :: TyFun a6989586621680742398 (t6989586621680742381 a6989586621680742398 ~> Bool) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (Elem_6989586621680743921Sym0 :: TyFun a6989586621680742398 (t6989586621680742381 a6989586621680742398 ~> Bool) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (Elem_6989586621680743754Sym0 :: TyFun a6989586621680742398 (t6989586621680742381 a6989586621680742398 ~> Bool) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (Elem_6989586621680743413Sym0 :: TyFun a6989586621680742398 (t6989586621680742381 a6989586621680742398 ~> Bool) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (Elem_6989586621680743293Sym0 :: TyFun a6989586621680742398 (t6989586621680742381 a6989586621680742398 ~> Bool) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (ElemSym0 :: TyFun a6989586621680742398 (t6989586621680742381 a6989586621680742398 ~> Bool) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (DefaultEqSym1 a6989586621679774970 :: TyFun k6989586621679774969 Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Eq

SuppressUnusedWarnings ((==@#@$$) x6989586621679774976 :: TyFun a6989586621679774975 Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Eq

SuppressUnusedWarnings ((/=@#@$$) x6989586621679774978 :: TyFun a6989586621679774975 Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Eq

SuppressUnusedWarnings (Bool_Sym1 a6989586621679771150 :: TyFun a6989586621679771144 (Bool ~> a6989586621679771144) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Bool

SuppressUnusedWarnings (TFHelper_6989586621679792578Sym1 a6989586621679792576 :: TyFun a6989586621679792381 Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

SuppressUnusedWarnings (TFHelper_6989586621679792560Sym1 a6989586621679792558 :: TyFun a6989586621679792381 Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

SuppressUnusedWarnings (TFHelper_6989586621679792542Sym1 a6989586621679792540 :: TyFun a6989586621679792381 Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

SuppressUnusedWarnings (TFHelper_6989586621679792524Sym1 a6989586621679792522 :: TyFun a6989586621679792381 Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

SuppressUnusedWarnings (Let6989586621679792622Scrutinee_6989586621679792413Sym1 x6989586621679792620 :: TyFun k1 Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

SuppressUnusedWarnings (Let6989586621679792604Scrutinee_6989586621679792411Sym1 x6989586621679792602 :: TyFun k1 Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

SuppressUnusedWarnings (Let6989586621679792513Scrutinee_6989586621679792401Sym1 x6989586621679792506 :: TyFun k1 Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

SuppressUnusedWarnings (Let6989586621679792508Scrutinee_6989586621679792399Sym1 x6989586621679792506 :: TyFun k1 Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

SuppressUnusedWarnings ((>@#@$$) arg6989586621679792482 :: TyFun a6989586621679792381 Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

SuppressUnusedWarnings ((>=@#@$$) arg6989586621679792486 :: TyFun a6989586621679792381 Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

SuppressUnusedWarnings ((<@#@$$) arg6989586621679792474 :: TyFun a6989586621679792381 Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

SuppressUnusedWarnings ((<=@#@$$) arg6989586621679792478 :: TyFun a6989586621679792381 Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

SuppressUnusedWarnings (TFHelper_6989586621681108278Sym0 :: TyFun (Arg a6989586621681107123 b6989586621681107124) (Arg a6989586621681107123 b6989586621681107124 ~> Bool) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (Elem_6989586621680921217Sym1 a6989586621680921215 :: TyFun (Identity a6989586621680742398) Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Identity

SuppressUnusedWarnings (Let6989586621680320576ZsSym0 :: TyFun (k1 ~> (a6989586621680316340 ~> Bool)) (TyFun k1 (TyFun [a6989586621680316340] [a6989586621680316340] -> Type) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (Let6989586621680320576YsSym0 :: TyFun (k1 ~> (a6989586621680316340 ~> Bool)) (TyFun k1 (TyFun [a6989586621680316340] [a6989586621680316340] -> Type) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (Let6989586621680320576X_6989586621680320577Sym0 :: TyFun (k1 ~> (a6989586621680316340 ~> Bool)) (TyFun k1 (TyFun [a6989586621680316340] ([a6989586621680316340], [a6989586621680316340]) -> Type) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (Let6989586621680320428NubBy'Sym0 :: TyFun (k1 ~> (k1 ~> Bool)) (TyFun k (TyFun [k1] ([k1] ~> [k1]) -> Type) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (Lambda_6989586621680320756Sym0 :: TyFun (a6989586621680316437 ~> Bool) (TyFun k (TyFun a6989586621680316437 (TyFun [a6989586621680316437] [a6989586621680316437] -> Type) -> Type) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (Let6989586621680742847Scrutinee_6989586621680742632Sym0 :: TyFun (a6989586621680742384 ~> Bool) (TyFun (t6989586621680742381 a6989586621680742384) Any -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (Let6989586621680742834Scrutinee_6989586621680742634Sym0 :: TyFun (a6989586621680742384 ~> Bool) (TyFun (t6989586621680742381 a6989586621680742384) All -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (Let6989586621680742749Scrutinee_6989586621680742640Sym0 :: TyFun (a6989586621680742384 ~> Bool) (TyFun (t6989586621680742381 a6989586621680742384) (First a6989586621680742384) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (Lambda_6989586621680742750Sym0 :: TyFun (a6989586621679087424 ~> Bool) (TyFun k (TyFun a6989586621679087424 (First a6989586621679087424) -> Type) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (FindSym0 :: TyFun (a6989586621680742290 ~> Bool) (t6989586621680742289 a6989586621680742290 ~> Maybe a6989586621680742290) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (AnySym0 :: TyFun (a6989586621680742300 ~> Bool) (t6989586621680742299 a6989586621680742300 ~> Bool) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (AllSym0 :: TyFun (a6989586621680742298 ~> Bool) (t6989586621680742297 a6989586621680742298 ~> Bool) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (Let6989586621679941729GoSym0 :: TyFun (k1 ~> Bool) (TyFun (k1 ~> k1) (TyFun k2 (TyFun k1 k1 -> Type) -> Type) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Base

SuppressUnusedWarnings (MfilterSym0 :: TyFun (a6989586621681401666 ~> Bool) (m6989586621681401665 a6989586621681401666 ~> m6989586621681401665 a6989586621681401666) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad

SuppressUnusedWarnings (FilterMSym0 :: TyFun (a6989586621681401704 ~> m6989586621681401703 Bool) ([a6989586621681401704] ~> m6989586621681401703 [a6989586621681401704]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad

(SingI d1, SingI d2) => SingI (Bool_Sym2 d1 d2 :: TyFun Bool a -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Bool

Methods

sing :: Sing (Bool_Sym2 d1 d2) #

(SingI d1, SingI d2) => SingI (Elem_bySym2 d1 d2 :: TyFun [a] Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing (Elem_bySym2 d1 d2) #

SFoldable t => SingI (NullSym0 :: TyFun (t a) Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

Methods

sing :: Sing NullSym0 #

(SFoldable t, SEq a, SingI d) => SingI (NotElemSym1 d t :: TyFun (t a) Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

Methods

sing :: Sing (NotElemSym1 d t) #

(SFoldable t, SEq a, SingI d) => SingI (ElemSym1 d t :: TyFun (t a) Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

Methods

sing :: Sing (ElemSym1 d t) #

(SFoldable t, SingI d) => SingI (AnySym1 d t :: TyFun (t a) Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

Methods

sing :: Sing (AnySym1 d t) #

(SFoldable t, SingI d) => SingI (AllSym1 d t :: TyFun (t a) Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

Methods

sing :: Sing (AllSym1 d t) #

SuppressUnusedWarnings (Bool_Sym2 a6989586621679771151 a6989586621679771150 :: TyFun Bool a6989586621679771144 -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Bool

SuppressUnusedWarnings (Elem_bySym2 a6989586621680320413 a6989586621680320412 :: TyFun [a6989586621680316317] Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (Let6989586621680320760Scrutinee_6989586621680316995Sym0 :: TyFun k1 (TyFun [a6989586621680316437] (TyFun (k1 ~> Bool) (TyFun k Bool -> Type) -> Type) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (Let6989586621680320655Scrutinee_6989586621680317001Sym0 :: TyFun k1 (TyFun k2 (TyFun k3 Bool -> Type) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (Let6989586621680320641Scrutinee_6989586621680317003Sym0 :: TyFun k1 (TyFun k2 (TyFun k3 Bool -> Type) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (Let6989586621680320561Scrutinee_6989586621680317013Sym0 :: TyFun k1 (TyFun k1 (TyFun k2 (TyFun k3 Bool -> Type) -> Type) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (Let6989586621680320493Scrutinee_6989586621680317017Sym1 n6989586621680320491 :: TyFun k Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (Let6989586621680320474Scrutinee_6989586621680317019Sym0 :: TyFun k1 (TyFun k2 (TyFun k3 Bool -> Type) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (Let6989586621680320459Scrutinee_6989586621680317021Sym0 :: TyFun k1 (TyFun k2 (TyFun [k1] (TyFun k3 Bool -> Type) -> Type) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (Let6989586621680320438Scrutinee_6989586621680317023Sym0 :: TyFun k1 (TyFun k2 (TyFun [k1] (TyFun (k1 ~> (k1 ~> Bool)) (TyFun k3 Bool -> Type) -> Type) -> Type) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (Null_6989586621680744215Sym0 :: TyFun (t6989586621680742381 a6989586621680742396) Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (Null_6989586621680744048Sym0 :: TyFun (t6989586621680742381 a6989586621680742396) Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (Null_6989586621680743881Sym0 :: TyFun (t6989586621680742381 a6989586621680742396) Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (Null_6989586621680743732Sym0 :: TyFun (t6989586621680742381 a6989586621680742396) Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (Null_6989586621680743556Sym0 :: TyFun (t6989586621680742381 a6989586621680742396) Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (Null_6989586621680743249Sym0 :: TyFun (t6989586621680742381 a6989586621680742396) Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (NullSym0 :: TyFun (t6989586621680742381 a6989586621680742396) Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (NotElemSym1 a6989586621680742770 t6989586621680742291 :: TyFun (t6989586621680742291 a6989586621680742292) Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (Lambda_6989586621680743256Sym0 :: TyFun k1 (TyFun k2 (TyFun k3 Bool -> Type) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (Elem_6989586621680744088Sym1 a6989586621680744086 t6989586621680742381 :: TyFun (t6989586621680742381 a6989586621680742398) Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (Elem_6989586621680743921Sym1 a6989586621680743919 t6989586621680742381 :: TyFun (t6989586621680742381 a6989586621680742398) Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (Elem_6989586621680743754Sym1 a6989586621680743752 t6989586621680742381 :: TyFun (t6989586621680742381 a6989586621680742398) Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (Elem_6989586621680743413Sym1 a6989586621680743411 t6989586621680742381 :: TyFun (t6989586621680742381 a6989586621680742398) Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (Elem_6989586621680743293Sym1 a6989586621680743291 t6989586621680742381 :: TyFun (t6989586621680742381 a6989586621680742398) Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (ElemSym1 arg6989586621680743044 t6989586621680742381 :: TyFun (t6989586621680742381 a6989586621680742398) Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (AnySym1 a6989586621680742841 t6989586621680742299 :: TyFun (t6989586621680742299 a6989586621680742300) Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (AllSym1 a6989586621680742828 t6989586621680742297 :: TyFun (t6989586621680742297 a6989586621680742298) Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (Lambda_6989586621681402162Sym0 :: TyFun k1 (TyFun k2 (TyFun k3 (TyFun Bool (TyFun [k1] [k1] -> Type) -> Type) -> Type) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad

SuppressUnusedWarnings (TFHelper_6989586621681108278Sym1 a6989586621681108276 :: TyFun (Arg a6989586621681107123 b6989586621681107124) Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (Lambda_6989586621681402159Sym0 :: TyFun (k2 ~> f6989586621679962807 Bool) (TyFun k3 (TyFun k2 (TyFun (f6989586621679962807 [k2]) (f6989586621679962807 [k2]) -> Type) -> Type) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad

SuppressUnusedWarnings (Lambda_6989586621681401991Sym0 :: TyFun (k1 ~> Bool) (TyFun k (TyFun k1 (m6989586621679962831 k1) -> Type) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad

SuppressUnusedWarnings (Let6989586621680320760Scrutinee_6989586621680316995Sym1 x6989586621680320758 :: TyFun [a6989586621680316437] (TyFun (k1 ~> Bool) (TyFun k Bool -> Type) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (Let6989586621680320655Scrutinee_6989586621680317001Sym1 n6989586621680320652 :: TyFun k2 (TyFun k3 Bool -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (Let6989586621680320641Scrutinee_6989586621680317003Sym1 n6989586621680320638 :: TyFun k2 (TyFun k3 Bool -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (Let6989586621680320561Scrutinee_6989586621680317013Sym1 key6989586621680320557 :: TyFun k1 (TyFun k2 (TyFun k3 Bool -> Type) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (Let6989586621680320474Scrutinee_6989586621680317019Sym1 x6989586621680320471 :: TyFun k2 (TyFun k3 Bool -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (Let6989586621680320459Scrutinee_6989586621680317021Sym1 x6989586621680320456 :: TyFun k2 (TyFun [k1] (TyFun k3 Bool -> Type) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (Let6989586621680320438Scrutinee_6989586621680317023Sym1 y6989586621680320435 :: TyFun k2 (TyFun [k1] (TyFun (k1 ~> (k1 ~> Bool)) (TyFun k3 Bool -> Type) -> Type) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (Lambda_6989586621680743256Sym1 a_69895866216807432516989586621680743255 :: TyFun k2 (TyFun k3 Bool -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (Let6989586621680129192Scrutinee_6989586621680128958Sym0 :: TyFun k1 (TyFun k2 (TyFun k1 (TyFun k3 (TyFun k4 Bool -> Type) -> Type) -> Type) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Enum

SuppressUnusedWarnings (Lambda_6989586621681402162Sym1 x6989586621681402161 :: TyFun k2 (TyFun k3 (TyFun Bool (TyFun [k1] [k1] -> Type) -> Type) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad

SuppressUnusedWarnings (Let6989586621680320459Scrutinee_6989586621680317021Sym2 xs6989586621680320457 x6989586621680320456 :: TyFun [k1] (TyFun k3 Bool -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (Let6989586621680320438Scrutinee_6989586621680317023Sym2 ys6989586621680320436 y6989586621680320435 :: TyFun [k1] (TyFun (k1 ~> (k1 ~> Bool)) (TyFun k3 Bool -> Type) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (Let6989586621680320655Scrutinee_6989586621680317001Sym2 x6989586621680320653 n6989586621680320652 :: TyFun k3 Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (Let6989586621680320641Scrutinee_6989586621680317003Sym2 x6989586621680320639 n6989586621680320638 :: TyFun k3 Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (Let6989586621680320561Scrutinee_6989586621680317013Sym2 x6989586621680320558 key6989586621680320557 :: TyFun k2 (TyFun k3 Bool -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (Let6989586621680320474Scrutinee_6989586621680317019Sym2 xs6989586621680320472 x6989586621680320471 :: TyFun k3 Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (Lambda_6989586621680743256Sym2 t6989586621680743263 a_69895866216807432516989586621680743255 :: TyFun k3 Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (Let6989586621680129192Scrutinee_6989586621680128958Sym1 x6989586621680129191 :: TyFun k2 (TyFun k1 (TyFun k3 (TyFun k4 Bool -> Type) -> Type) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Enum

SuppressUnusedWarnings (Let6989586621680129115Scrutinee_6989586621680128972Sym0 :: TyFun k1 (TyFun k2 (TyFun k1 (TyFun k3 (TyFun k4 (TyFun k5 Bool -> Type) -> Type) -> Type) -> Type) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Enum

SuppressUnusedWarnings (Let6989586621680129058Scrutinee_6989586621680128982Sym0 :: TyFun k1 (TyFun k2 (TyFun k1 (TyFun k3 (TyFun k4 (TyFun k5 Bool -> Type) -> Type) -> Type) -> Type) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Enum

SuppressUnusedWarnings (Lambda_6989586621681402162Sym2 p6989586621681402157 x6989586621681402161 :: TyFun k3 (TyFun Bool (TyFun [k1] [k1] -> Type) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad

SuppressUnusedWarnings (Let6989586621680320760Scrutinee_6989586621680316995Sym2 xs6989586621680320759 x6989586621680320758 :: TyFun (k1 ~> Bool) (TyFun k Bool -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (Lambda_6989586621680320828Sym0 :: TyFun (b6989586621679962835 ~> (a6989586621680316420 ~> Bool)) (TyFun k1 (TyFun k2 (TyFun a6989586621680316420 (TyFun [a6989586621680316420] (TyFun b6989586621679962835 (m6989586621679962831 b6989586621679962835) -> Type) -> Type) -> Type) -> Type) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (Lambda_6989586621681402162Sym3 a_69895866216814021556989586621681402158 p6989586621681402157 x6989586621681402161 :: TyFun Bool (TyFun [k1] [k1] -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad

SuppressUnusedWarnings (Let6989586621680320760Scrutinee_6989586621680316995Sym3 p6989586621680320754 xs6989586621680320759 x6989586621680320758 :: TyFun k Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (Let6989586621680320561Scrutinee_6989586621680317013Sym3 y6989586621680320559 x6989586621680320558 key6989586621680320557 :: TyFun k3 Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (Let6989586621680320459Scrutinee_6989586621680317021Sym3 ls6989586621680320458 xs6989586621680320457 x6989586621680320456 :: TyFun k3 Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (Let6989586621680129192Scrutinee_6989586621680128958Sym2 x06989586621680129182 x6989586621680129191 :: TyFun k1 (TyFun k3 (TyFun k4 Bool -> Type) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Enum

SuppressUnusedWarnings (Let6989586621680129115Scrutinee_6989586621680128972Sym1 x16989586621680129110 :: TyFun k2 (TyFun k1 (TyFun k3 (TyFun k4 (TyFun k5 Bool -> Type) -> Type) -> Type) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Enum

SuppressUnusedWarnings (Let6989586621680129058Scrutinee_6989586621680128982Sym1 x16989586621680129053 :: TyFun k2 (TyFun k1 (TyFun k3 (TyFun k4 (TyFun k5 Bool -> Type) -> Type) -> Type) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Enum

SuppressUnusedWarnings (Let6989586621680320438Scrutinee_6989586621680317023Sym3 xs6989586621680320437 ys6989586621680320436 y6989586621680320435 :: TyFun (k1 ~> (k1 ~> Bool)) (TyFun k3 Bool -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (Let6989586621680320438Scrutinee_6989586621680317023Sym4 eq6989586621680320426 xs6989586621680320437 ys6989586621680320436 y6989586621680320435 :: TyFun k3 Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (Let6989586621680129192Scrutinee_6989586621680128958Sym3 y6989586621680129183 x06989586621680129182 x6989586621680129191 :: TyFun k3 (TyFun k4 Bool -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Enum

SuppressUnusedWarnings (Let6989586621680129115Scrutinee_6989586621680128972Sym2 x26989586621680129111 x16989586621680129110 :: TyFun k1 (TyFun k3 (TyFun k4 (TyFun k5 Bool -> Type) -> Type) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Enum

SuppressUnusedWarnings (Let6989586621680129058Scrutinee_6989586621680128982Sym2 x26989586621680129054 x16989586621680129053 :: TyFun k1 (TyFun k3 (TyFun k4 (TyFun k5 Bool -> Type) -> Type) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Enum

SuppressUnusedWarnings (Let6989586621680129192Scrutinee_6989586621680128958Sym4 arg_69895866216801289546989586621680129178 y6989586621680129183 x06989586621680129182 x6989586621680129191 :: TyFun k4 Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Enum

SuppressUnusedWarnings (Let6989586621680129115Scrutinee_6989586621680128972Sym3 y6989586621680129112 x26989586621680129111 x16989586621680129110 :: TyFun k3 (TyFun k4 (TyFun k5 Bool -> Type) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Enum

SuppressUnusedWarnings (Let6989586621680129058Scrutinee_6989586621680128982Sym3 y6989586621680129055 x26989586621680129054 x16989586621680129053 :: TyFun k3 (TyFun k4 (TyFun k5 Bool -> Type) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Enum

SuppressUnusedWarnings (Let6989586621680129115Scrutinee_6989586621680128972Sym4 arg_69895866216801289666989586621680129105 y6989586621680129112 x26989586621680129111 x16989586621680129110 :: TyFun k4 (TyFun k5 Bool -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Enum

SuppressUnusedWarnings (Let6989586621680129058Scrutinee_6989586621680128982Sym4 arg_69895866216801289766989586621680129048 y6989586621680129055 x26989586621680129054 x16989586621680129053 :: TyFun k4 (TyFun k5 Bool -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Enum

SuppressUnusedWarnings (Let6989586621680129115Scrutinee_6989586621680128972Sym5 arg_69895866216801289686989586621680129106 arg_69895866216801289666989586621680129105 y6989586621680129112 x26989586621680129111 x16989586621680129110 :: TyFun k5 Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Enum

SuppressUnusedWarnings (Let6989586621680129058Scrutinee_6989586621680128982Sym5 arg_69895866216801289786989586621680129049 arg_69895866216801289766989586621680129048 y6989586621680129055 x26989586621680129054 x16989586621680129053 :: TyFun k5 Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Enum

type Rep Bool 
Instance details

Defined in GHC.Generics

type Rep Bool = D1 ('MetaData "Bool" "GHC.Types" "ghc-prim" 'False) (C1 ('MetaCons "False" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "True" 'PrefixI 'False) (U1 :: Type -> Type))
data Sing (a :: Bool) 
Instance details

Defined in GHC.Generics

data Sing (a :: Bool) where
type DemoteRep Bool 
Instance details

Defined in GHC.Generics

type DemoteRep Bool = Bool
newtype Vector Bool 
Instance details

Defined in Data.Vector.Unboxed.Base

type ToT Bool 
Instance details

Defined in Michelson.Typed.Haskell.Value

type ToT Bool = 'TBool
type TypeDocFieldDescriptions Bool 
Instance details

Defined in Michelson.Typed.Haskell.Doc

type Sing 
Instance details

Defined in Data.Singletons.Prelude.Instances

type Sing = SBool
type MaxBound 
Instance details

Defined in Data.Singletons.Prelude.Enum

type MaxBound = MaxBound_6989586621680125214Sym0
type MinBound 
Instance details

Defined in Data.Singletons.Prelude.Enum

type MinBound = MinBound_6989586621680125212Sym0
type Demote Bool 
Instance details

Defined in Data.Singletons.Prelude.Instances

type UnaryArithResHs Not Bool 
Instance details

Defined in Lorentz.Arith

type Show_ (arg0 :: Bool) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Show_ (arg0 :: Bool) = Apply (Show__6989586621680577846Sym0 :: TyFun Bool Symbol -> Type) arg0
type FromEnum (a :: Bool) 
Instance details

Defined in Data.Singletons.Prelude.Enum

type FromEnum (a :: Bool) = Apply FromEnum_6989586621680152586Sym0 a
type ToEnum a 
Instance details

Defined in Data.Singletons.Prelude.Enum

type ToEnum a = Apply ToEnum_6989586621680152573Sym0 a
type Pred (arg0 :: Bool) 
Instance details

Defined in Data.Singletons.Prelude.Enum

type Pred (arg0 :: Bool) = Apply (Pred_6989586621680129239Sym0 :: TyFun Bool Bool -> Type) arg0
type Succ (arg0 :: Bool) 
Instance details

Defined in Data.Singletons.Prelude.Enum

type Succ (arg0 :: Bool) = Apply (Succ_6989586621680129224Sym0 :: TyFun Bool Bool -> Type) arg0
newtype MVector s Bool 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype MVector s Bool = MV_Bool (MVector s Word8)
type ArithResHs Or Bool Bool 
Instance details

Defined in Lorentz.Arith

type ArithResHs And Bool Bool 
Instance details

Defined in Lorentz.Arith

type ArithResHs Xor Bool Bool 
Instance details

Defined in Lorentz.Arith

type ShowList (arg1 :: [Bool]) arg2 
Instance details

Defined in Data.Singletons.Prelude.Show

type ShowList (arg1 :: [Bool]) arg2 = Apply (Apply (ShowList_6989586621680577854Sym0 :: TyFun [Bool] (Symbol ~> Symbol) -> Type) arg1) arg2
type EnumFromTo (arg1 :: Bool) (arg2 :: Bool) 
Instance details

Defined in Data.Singletons.Prelude.Enum

type EnumFromTo (arg1 :: Bool) (arg2 :: Bool) = Apply (Apply (EnumFromTo_6989586621680129249Sym0 :: TyFun Bool (Bool ~> [Bool]) -> Type) arg1) arg2
type Min (arg1 :: Bool) (arg2 :: Bool) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Min (arg1 :: Bool) (arg2 :: Bool) = Apply (Apply (Min_6989586621679792614Sym0 :: TyFun Bool (Bool ~> Bool) -> Type) arg1) arg2
type Max (arg1 :: Bool) (arg2 :: Bool) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Max (arg1 :: Bool) (arg2 :: Bool) = Apply (Apply (Max_6989586621679792596Sym0 :: TyFun Bool (Bool ~> Bool) -> Type) arg1) arg2
type (arg1 :: Bool) >= (arg2 :: Bool) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type (arg1 :: Bool) >= (arg2 :: Bool) = Apply (Apply (TFHelper_6989586621679792578Sym0 :: TyFun Bool (Bool ~> Bool) -> Type) arg1) arg2
type (arg1 :: Bool) > (arg2 :: Bool) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type (arg1 :: Bool) > (arg2 :: Bool) = Apply (Apply (TFHelper_6989586621679792560Sym0 :: TyFun Bool (Bool ~> Bool) -> Type) arg1) arg2
type (arg1 :: Bool) <= (arg2 :: Bool) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type (arg1 :: Bool) <= (arg2 :: Bool) = Apply (Apply (TFHelper_6989586621679792542Sym0 :: TyFun Bool (Bool ~> Bool) -> Type) arg1) arg2
type (arg1 :: Bool) < (arg2 :: Bool) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type (arg1 :: Bool) < (arg2 :: Bool) = Apply (Apply (TFHelper_6989586621679792524Sym0 :: TyFun Bool (Bool ~> Bool) -> Type) arg1) arg2
type Compare (a1 :: Bool) (a2 :: Bool) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Compare (a1 :: Bool) (a2 :: Bool) = Apply (Apply Compare_6989586621679803720Sym0 a1) a2
type (x :: Bool) /= (y :: Bool) 
Instance details

Defined in Data.Singletons.Prelude.Eq

type (x :: Bool) /= (y :: Bool) = Not (x == y)
type (a :: Bool) == (b :: Bool) 
Instance details

Defined in Data.Singletons.Prelude.Eq

type (a :: Bool) == (b :: Bool) = Equals_6989586621679776474 a b
type ShowsPrec a1 (a2 :: Bool) a3 
Instance details

Defined in Data.Singletons.Prelude.Show

type ShowsPrec a1 (a2 :: Bool) a3 = Apply (Apply (Apply ShowsPrec_6989586621680595859Sym0 a1) a2) a3
type EnumFromThenTo (arg1 :: Bool) (arg2 :: Bool) (arg3 :: Bool) 
Instance details

Defined in Data.Singletons.Prelude.Enum

type EnumFromThenTo (arg1 :: Bool) (arg2 :: Bool) (arg3 :: Bool) = Apply (Apply (Apply (EnumFromThenTo_6989586621680129262Sym0 :: TyFun Bool (Bool ~> (Bool ~> [Bool])) -> Type) arg1) arg2) arg3
type Apply NotSym0 (a6989586621679772458 :: Bool) 
Instance details

Defined in Data.Singletons.Prelude.Bool

type Apply NotSym0 (a6989586621679772458 :: Bool) = Not a6989586621679772458
type Apply FromEnum_6989586621680152586Sym0 (a6989586621680152585 :: Bool) 
Instance details

Defined in Data.Singletons.Prelude.Enum

type Apply FromEnum_6989586621680152586Sym0 (a6989586621680152585 :: Bool) = FromEnum_6989586621680152586 a6989586621680152585
type Apply All_Sym0 (a6989586621680229712 :: Bool) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply All_Sym0 (a6989586621680229712 :: Bool) = All_ a6989586621680229712
type Apply AllSym0 (t6989586621680197047 :: Bool) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply AllSym0 (t6989586621680197047 :: Bool) = 'All t6989586621680197047
type Apply Any_Sym0 (a6989586621680229711 :: Bool) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply Any_Sym0 (a6989586621680229711 :: Bool) = Any_ a6989586621680229711
type Apply AnySym0 (t6989586621680197060 :: Bool) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply AnySym0 (t6989586621680197060 :: Bool) = 'Any t6989586621680197060
type Apply ToEnum_6989586621680152573Sym0 (a6989586621680152572 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Enum

type Apply ToEnum_6989586621680152573Sym0 (a6989586621680152572 :: Nat) = ToEnum_6989586621680152573 a6989586621680152572
type Apply GetAllSym0 (a6989586621680197044 :: All) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply GetAllSym0 (a6989586621680197044 :: All) = GetAll a6989586621680197044
type Apply GetAnySym0 (a6989586621680197057 :: Any) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply GetAnySym0 (a6989586621680197057 :: Any) = GetAny a6989586621680197057
type Apply ((||@#@$$) a6989586621679772157 :: TyFun Bool Bool -> Type) (b6989586621679772158 :: Bool) 
Instance details

Defined in Data.Singletons.Prelude.Bool

type Apply ((||@#@$$) a6989586621679772157 :: TyFun Bool Bool -> Type) (b6989586621679772158 :: Bool) = a6989586621679772157 || b6989586621679772158
type Apply ((&&@#@$$) a6989586621679771912 :: TyFun Bool Bool -> Type) (b6989586621679771913 :: Bool) 
Instance details

Defined in Data.Singletons.Prelude.Bool

type Apply ((&&@#@$$) a6989586621679771912 :: TyFun Bool Bool -> Type) (b6989586621679771913 :: Bool) = a6989586621679771912 && b6989586621679771913
type Apply (Compare_6989586621679803720Sym1 a6989586621679803718 :: TyFun Bool Ordering -> Type) (a6989586621679803719 :: Bool) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Apply (Compare_6989586621679803720Sym1 a6989586621679803718 :: TyFun Bool Ordering -> Type) (a6989586621679803719 :: Bool) = Compare_6989586621679803720 a6989586621679803718 a6989586621679803719
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 (Let6989586621680734291Scrutinee_6989586621680734254Sym1 x6989586621680734284 :: TyFun k1 Bool -> Type) (y6989586621680734285 :: k1) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Let6989586621680734291Scrutinee_6989586621680734254Sym1 x6989586621680734284 :: TyFun k1 Bool -> Type) (y6989586621680734285 :: k1) = Let6989586621680734291Scrutinee_6989586621680734254 x6989586621680734284 y6989586621680734285
type Apply (Let6989586621680734318Scrutinee_6989586621680734256Sym1 x6989586621680734311 :: TyFun k1 Bool -> Type) (y6989586621680734312 :: k1) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Let6989586621680734318Scrutinee_6989586621680734256Sym1 x6989586621680734311 :: TyFun k1 Bool -> Type) (y6989586621680734312 :: k1) = Let6989586621680734318Scrutinee_6989586621680734256 x6989586621680734311 y6989586621680734312
type Apply ((==@#@$$) x6989586621679774976 :: TyFun a Bool -> Type) (y6989586621679774977 :: a) 
Instance details

Defined in Data.Singletons.Prelude.Eq

type Apply ((==@#@$$) x6989586621679774976 :: TyFun a Bool -> Type) (y6989586621679774977 :: a) = x6989586621679774976 == y6989586621679774977
type Apply ((/=@#@$$) x6989586621679774978 :: TyFun a Bool -> Type) (y6989586621679774979 :: a) 
Instance details

Defined in Data.Singletons.Prelude.Eq

type Apply ((/=@#@$$) x6989586621679774978 :: TyFun a Bool -> Type) (y6989586621679774979 :: a) = x6989586621679774978 /= y6989586621679774979
type Apply (DefaultEqSym1 a6989586621679774970 :: TyFun k Bool -> Type) (b6989586621679774971 :: k) 
Instance details

Defined in Data.Singletons.Prelude.Eq

type Apply (DefaultEqSym1 a6989586621679774970 :: TyFun k Bool -> Type) (b6989586621679774971 :: k) = DefaultEq a6989586621679774970 b6989586621679774971
type Apply (Let6989586621679792508Scrutinee_6989586621679792399Sym1 x6989586621679792506 :: TyFun k1 Bool -> Type) (y6989586621679792507 :: k1) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Apply (Let6989586621679792508Scrutinee_6989586621679792399Sym1 x6989586621679792506 :: TyFun k1 Bool -> Type) (y6989586621679792507 :: k1) = Let6989586621679792508Scrutinee_6989586621679792399 x6989586621679792506 y6989586621679792507
type Apply (TFHelper_6989586621679792578Sym1 a6989586621679792576 :: TyFun a Bool -> Type) (a6989586621679792577 :: a) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Apply (TFHelper_6989586621679792578Sym1 a6989586621679792576 :: TyFun a Bool -> Type) (a6989586621679792577 :: a) = TFHelper_6989586621679792578 a6989586621679792576 a6989586621679792577
type Apply (TFHelper_6989586621679792560Sym1 a6989586621679792558 :: TyFun a Bool -> Type) (a6989586621679792559 :: a) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Apply (TFHelper_6989586621679792560Sym1 a6989586621679792558 :: TyFun a Bool -> Type) (a6989586621679792559 :: a) = TFHelper_6989586621679792560 a6989586621679792558 a6989586621679792559
type Apply (TFHelper_6989586621679792542Sym1 a6989586621679792540 :: TyFun a Bool -> Type) (a6989586621679792541 :: a) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Apply (TFHelper_6989586621679792542Sym1 a6989586621679792540 :: TyFun a Bool -> Type) (a6989586621679792541 :: a) = TFHelper_6989586621679792542 a6989586621679792540 a6989586621679792541
type Apply (TFHelper_6989586621679792524Sym1 a6989586621679792522 :: TyFun a Bool -> Type) (a6989586621679792523 :: a) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Apply (TFHelper_6989586621679792524Sym1 a6989586621679792522 :: TyFun a Bool -> Type) (a6989586621679792523 :: a) = TFHelper_6989586621679792524 a6989586621679792522 a6989586621679792523
type Apply ((<=@#@$$) arg6989586621679792478 :: TyFun a Bool -> Type) (arg6989586621679792479 :: a) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Apply ((<=@#@$$) arg6989586621679792478 :: TyFun a Bool -> Type) (arg6989586621679792479 :: a) = arg6989586621679792478 <= arg6989586621679792479
type Apply ((>=@#@$$) arg6989586621679792486 :: TyFun a Bool -> Type) (arg6989586621679792487 :: a) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Apply ((>=@#@$$) arg6989586621679792486 :: TyFun a Bool -> Type) (arg6989586621679792487 :: a) = arg6989586621679792486 >= arg6989586621679792487
type Apply ((>@#@$$) arg6989586621679792482 :: TyFun a Bool -> Type) (arg6989586621679792483 :: a) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Apply ((>@#@$$) arg6989586621679792482 :: TyFun a Bool -> Type) (arg6989586621679792483 :: a) = arg6989586621679792482 > arg6989586621679792483
type Apply (Let6989586621679792622Scrutinee_6989586621679792413Sym1 x6989586621679792620 :: TyFun k1 Bool -> Type) (y6989586621679792621 :: k1) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Apply (Let6989586621679792622Scrutinee_6989586621679792413Sym1 x6989586621679792620 :: TyFun k1 Bool -> Type) (y6989586621679792621 :: k1) = Let6989586621679792622Scrutinee_6989586621679792413 x6989586621679792620 y6989586621679792621
type Apply (Let6989586621679792604Scrutinee_6989586621679792411Sym1 x6989586621679792602 :: TyFun k1 Bool -> Type) (y6989586621679792603 :: k1) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Apply (Let6989586621679792604Scrutinee_6989586621679792411Sym1 x6989586621679792602 :: TyFun k1 Bool -> Type) (y6989586621679792603 :: k1) = Let6989586621679792604Scrutinee_6989586621679792411 x6989586621679792602 y6989586621679792603
type Apply (Let6989586621679792513Scrutinee_6989586621679792401Sym1 x6989586621679792506 :: TyFun k1 Bool -> Type) (y6989586621679792507 :: k1) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Apply (Let6989586621679792513Scrutinee_6989586621679792401Sym1 x6989586621679792506 :: TyFun k1 Bool -> Type) (y6989586621679792507 :: k1) = Let6989586621679792513Scrutinee_6989586621679792401 x6989586621679792506 y6989586621679792507
type Apply ((<@#@$$) arg6989586621679792474 :: TyFun a Bool -> Type) (arg6989586621679792475 :: a) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Apply ((<@#@$$) arg6989586621679792474 :: TyFun a Bool -> Type) (arg6989586621679792475 :: a) = arg6989586621679792474 < arg6989586621679792475
type Apply (Bool_Sym2 a6989586621679771151 a6989586621679771150 :: TyFun Bool a -> Type) (a6989586621679771152 :: Bool) 
Instance details

Defined in Data.Singletons.Prelude.Bool

type Apply (Bool_Sym2 a6989586621679771151 a6989586621679771150 :: TyFun Bool a -> Type) (a6989586621679771152 :: Bool) = Bool_ a6989586621679771151 a6989586621679771150 a6989586621679771152
type Apply (Let6989586621680320493Scrutinee_6989586621680317017Sym1 n6989586621680320491 :: TyFun k Bool -> Type) (x6989586621680320492 :: k) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (Let6989586621680320493Scrutinee_6989586621680317017Sym1 n6989586621680320491 :: TyFun k Bool -> Type) (x6989586621680320492 :: k) = Let6989586621680320493Scrutinee_6989586621680317017 n6989586621680320491 x6989586621680320492
type Apply (Let6989586621680320474Scrutinee_6989586621680317019Sym2 xs6989586621680320472 x6989586621680320471 :: TyFun k3 Bool -> Type) (n6989586621680320473 :: k3) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (Let6989586621680320474Scrutinee_6989586621680317019Sym2 xs6989586621680320472 x6989586621680320471 :: TyFun k3 Bool -> Type) (n6989586621680320473 :: k3) = Let6989586621680320474Scrutinee_6989586621680317019 xs6989586621680320472 x6989586621680320471 n6989586621680320473
type Apply (Let6989586621680320641Scrutinee_6989586621680317003Sym2 x6989586621680320639 n6989586621680320638 :: TyFun k3 Bool -> Type) (xs6989586621680320640 :: k3) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (Let6989586621680320641Scrutinee_6989586621680317003Sym2 x6989586621680320639 n6989586621680320638 :: TyFun k3 Bool -> Type) (xs6989586621680320640 :: k3) = Let6989586621680320641Scrutinee_6989586621680317003 x6989586621680320639 n6989586621680320638 xs6989586621680320640
type Apply (Let6989586621680320655Scrutinee_6989586621680317001Sym2 x6989586621680320653 n6989586621680320652 :: TyFun k3 Bool -> Type) (xs6989586621680320654 :: k3) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (Let6989586621680320655Scrutinee_6989586621680317001Sym2 x6989586621680320653 n6989586621680320652 :: TyFun k3 Bool -> Type) (xs6989586621680320654 :: k3) = Let6989586621680320655Scrutinee_6989586621680317001 x6989586621680320653 n6989586621680320652 xs6989586621680320654
type Apply (Lambda_6989586621680743256Sym2 t6989586621680743263 a_69895866216807432516989586621680743255 :: TyFun k3 Bool -> Type) (t6989586621680743264 :: k3) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Lambda_6989586621680743256Sym2 t6989586621680743263 a_69895866216807432516989586621680743255 :: TyFun k3 Bool -> Type) (t6989586621680743264 :: k3) = Lambda_6989586621680743256 t6989586621680743263 a_69895866216807432516989586621680743255 t6989586621680743264
type Apply (Let6989586621680320561Scrutinee_6989586621680317013Sym3 y6989586621680320559 x6989586621680320558 key6989586621680320557 :: TyFun k3 Bool -> Type) (xys6989586621680320560 :: k3) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (Let6989586621680320561Scrutinee_6989586621680317013Sym3 y6989586621680320559 x6989586621680320558 key6989586621680320557 :: TyFun k3 Bool -> Type) (xys6989586621680320560 :: k3) = Let6989586621680320561Scrutinee_6989586621680317013 y6989586621680320559 x6989586621680320558 key6989586621680320557 xys6989586621680320560
type Apply (Let6989586621680320459Scrutinee_6989586621680317021Sym3 ls6989586621680320458 xs6989586621680320457 x6989586621680320456 :: TyFun k3 Bool -> Type) (l6989586621680320449 :: k3) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (Let6989586621680320459Scrutinee_6989586621680317021Sym3 ls6989586621680320458 xs6989586621680320457 x6989586621680320456 :: TyFun k3 Bool -> Type) (l6989586621680320449 :: k3) = Let6989586621680320459Scrutinee_6989586621680317021 ls6989586621680320458 xs6989586621680320457 x6989586621680320456 l6989586621680320449
type Apply (Let6989586621680320760Scrutinee_6989586621680316995Sym3 p6989586621680320754 xs6989586621680320759 x6989586621680320758 :: TyFun k Bool -> Type) (a_69895866216803207526989586621680320755 :: k) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (Let6989586621680320760Scrutinee_6989586621680316995Sym3 p6989586621680320754 xs6989586621680320759 x6989586621680320758 :: TyFun k Bool -> Type) (a_69895866216803207526989586621680320755 :: k) = Let6989586621680320760Scrutinee_6989586621680316995 p6989586621680320754 xs6989586621680320759 x6989586621680320758 a_69895866216803207526989586621680320755
type Apply (Let6989586621680320438Scrutinee_6989586621680317023Sym4 eq6989586621680320426 xs6989586621680320437 ys6989586621680320436 y6989586621680320435 :: TyFun k3 Bool -> Type) (l6989586621680320427 :: k3) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (Let6989586621680320438Scrutinee_6989586621680317023Sym4 eq6989586621680320426 xs6989586621680320437 ys6989586621680320436 y6989586621680320435 :: TyFun k3 Bool -> Type) (l6989586621680320427 :: k3) = Let6989586621680320438Scrutinee_6989586621680317023 eq6989586621680320426 xs6989586621680320437 ys6989586621680320436 y6989586621680320435 l6989586621680320427
type Apply (Let6989586621680129192Scrutinee_6989586621680128958Sym4 arg_69895866216801289546989586621680129178 y6989586621680129183 x06989586621680129182 x6989586621680129191 :: TyFun k4 Bool -> Type) (arg_69895866216801289566989586621680129179 :: k4) 
Instance details

Defined in Data.Singletons.Prelude.Enum

type Apply (Let6989586621680129192Scrutinee_6989586621680128958Sym4 arg_69895866216801289546989586621680129178 y6989586621680129183 x06989586621680129182 x6989586621680129191 :: TyFun k4 Bool -> Type) (arg_69895866216801289566989586621680129179 :: k4) = Let6989586621680129192Scrutinee_6989586621680128958 arg_69895866216801289546989586621680129178 y6989586621680129183 x06989586621680129182 x6989586621680129191 arg_69895866216801289566989586621680129179
type Apply (Let6989586621680129058Scrutinee_6989586621680128982Sym5 arg_69895866216801289786989586621680129049 arg_69895866216801289766989586621680129048 y6989586621680129055 x26989586621680129054 x16989586621680129053 :: TyFun k5 Bool -> Type) (arg_69895866216801289806989586621680129050 :: k5) 
Instance details

Defined in Data.Singletons.Prelude.Enum

type Apply (Let6989586621680129058Scrutinee_6989586621680128982Sym5 arg_69895866216801289786989586621680129049 arg_69895866216801289766989586621680129048 y6989586621680129055 x26989586621680129054 x16989586621680129053 :: TyFun k5 Bool -> Type) (arg_69895866216801289806989586621680129050 :: k5) = Let6989586621680129058Scrutinee_6989586621680128982 arg_69895866216801289786989586621680129049 arg_69895866216801289766989586621680129048 y6989586621680129055 x26989586621680129054 x16989586621680129053 arg_69895866216801289806989586621680129050
type Apply (Let6989586621680129115Scrutinee_6989586621680128972Sym5 arg_69895866216801289686989586621680129106 arg_69895866216801289666989586621680129105 y6989586621680129112 x26989586621680129111 x16989586621680129110 :: TyFun k5 Bool -> Type) (arg_69895866216801289706989586621680129107 :: k5) 
Instance details

Defined in Data.Singletons.Prelude.Enum

type Apply (Let6989586621680129115Scrutinee_6989586621680128972Sym5 arg_69895866216801289686989586621680129106 arg_69895866216801289666989586621680129105 y6989586621680129112 x26989586621680129111 x16989586621680129110 :: TyFun k5 Bool -> Type) (arg_69895866216801289706989586621680129107 :: k5) = Let6989586621680129115Scrutinee_6989586621680128972 arg_69895866216801289686989586621680129106 arg_69895866216801289666989586621680129105 y6989586621680129112 x26989586621680129111 x16989586621680129110 arg_69895866216801289706989586621680129107
type Eval (Not 'False) 
Instance details

Defined in Fcf.Data.Bool

type Eval (Not 'False) = 'True
type Eval (Not 'True) 
Instance details

Defined in Fcf.Data.Bool

type Eval (Not 'True) = 'False
type Apply (GuardSym0 :: TyFun Bool (f6989586621679962724 ()) -> Type) (a6989586621679962890 :: Bool) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type Apply (GuardSym0 :: TyFun Bool (f6989586621679962724 ()) -> Type) (a6989586621679962890 :: Bool) = Guard a6989586621679962890 :: f6989586621679962724 ()
type Eval (Null (a2 ': as) :: Bool -> Type) 
Instance details

Defined in Fcf.Data.List

type Eval (Null (a2 ': as) :: Bool -> Type) = 'False
type Eval (Null ('[] :: [a]) :: Bool -> Type) 
Instance details

Defined in Fcf.Data.List

type Eval (Null ('[] :: [a]) :: Bool -> Type) = 'True
type Eval (a <= b :: Bool -> Type) 
Instance details

Defined in Fcf.Data.Nat

type Eval (a <= b :: Bool -> Type) = a <=? b
type Eval (a >= b :: Bool -> Type) 
Instance details

Defined in Fcf.Data.Nat

type Eval (a >= b :: Bool -> Type) = b <=? a
type Eval (a < b :: Bool -> Type) 
Instance details

Defined in Fcf.Data.Nat

type Eval (a < b :: Bool -> Type) = Eval (Not =<< (a >= b))
type Eval (a > b :: Bool -> Type) 
Instance details

Defined in Fcf.Data.Nat

type Eval (a > b :: Bool -> Type) = Eval (Not =<< (a <= b))
type Eval ('False || b :: Bool -> Type) 
Instance details

Defined in Fcf.Data.Bool

type Eval ('False || b :: Bool -> Type) = b
type Eval ('True || b :: Bool -> Type) 
Instance details

Defined in Fcf.Data.Bool

type Eval ('True || b :: Bool -> Type) = 'True
type Eval (a || 'False :: Bool -> Type) 
Instance details

Defined in Fcf.Data.Bool

type Eval (a || 'False :: Bool -> Type) = a
type Eval (a || 'True :: Bool -> Type) 
Instance details

Defined in Fcf.Data.Bool

type Eval (a || 'True :: Bool -> Type) = 'True
type Eval ('False && b :: Bool -> Type) 
Instance details

Defined in Fcf.Data.Bool

type Eval ('False && b :: Bool -> Type) = 'False
type Eval ('True && b :: Bool -> Type) 
Instance details

Defined in Fcf.Data.Bool

type Eval ('True && b :: Bool -> Type) = b
type Eval (a && 'True :: Bool -> Type) 
Instance details

Defined in Fcf.Data.Bool

type Eval (a && 'True :: Bool -> Type) = a
type Eval (a && 'False :: Bool -> Type) 
Instance details

Defined in Fcf.Data.Bool

type Eval (a && 'False :: Bool -> Type) = 'False
type Eval (IsNothing ('Nothing :: Maybe a) :: Bool -> Type) 
Instance details

Defined in Fcf.Data.Common

type Eval (IsNothing ('Nothing :: Maybe a) :: Bool -> Type) = 'True
type Eval (IsNothing ('Just _a) :: Bool -> Type) 
Instance details

Defined in Fcf.Data.Common

type Eval (IsNothing ('Just _a) :: Bool -> Type) = 'False
type Eval (IsJust ('Nothing :: Maybe a) :: Bool -> Type) 
Instance details

Defined in Fcf.Data.Common

type Eval (IsJust ('Nothing :: Maybe a) :: Bool -> Type) = 'False
type Eval (IsJust ('Just _a) :: Bool -> Type) 
Instance details

Defined in Fcf.Data.Common

type Eval (IsJust ('Just _a) :: Bool -> Type) = 'True
type Apply (||@#@$) (a6989586621679772157 :: Bool) 
Instance details

Defined in Data.Singletons.Prelude.Bool

type Apply (||@#@$) (a6989586621679772157 :: Bool) = (||@#@$$) a6989586621679772157
type Apply (&&@#@$) (a6989586621679771912 :: Bool) 
Instance details

Defined in Data.Singletons.Prelude.Bool

type Apply (&&@#@$) (a6989586621679771912 :: Bool) = (&&@#@$$) a6989586621679771912
type Apply Compare_6989586621679803720Sym0 (a6989586621679803718 :: Bool) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Apply Compare_6989586621679803720Sym0 (a6989586621679803718 :: Bool) = Compare_6989586621679803720Sym1 a6989586621679803718
type Apply ShowParenSym0 (a6989586621680577755 :: Bool) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply ShowParenSym0 (a6989586621680577755 :: Bool) = ShowParenSym1 a6989586621680577755
type Apply ShowsPrec_6989586621680595859Sym0 (a6989586621680595856 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply ShowsPrec_6989586621680595859Sym0 (a6989586621680595856 :: Nat) = ShowsPrec_6989586621680595859Sym1 a6989586621680595856
type Apply (<=?@#@$) (a3530822107858468865 :: Nat) 
Instance details

Defined in Data.Singletons.TypeLits.Internal

type Apply (<=?@#@$) (a3530822107858468865 :: Nat) = (<=?@#@$$) a3530822107858468865
type Apply (ShowsPrec_6989586621680595859Sym1 a6989586621680595856 :: TyFun Bool (Symbol ~> Symbol) -> Type) (a6989586621680595857 :: Bool) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680595859Sym1 a6989586621680595856 :: TyFun Bool (Symbol ~> Symbol) -> Type) (a6989586621680595857 :: Bool) = ShowsPrec_6989586621680595859Sym2 a6989586621680595856 a6989586621680595857
type Apply (WhenSym0 :: TyFun Bool (f6989586621679962753 () ~> f6989586621679962753 ()) -> Type) (a6989586621679963138 :: Bool) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type Apply (WhenSym0 :: TyFun Bool (f6989586621679962753 () ~> f6989586621679962753 ()) -> Type) (a6989586621679963138 :: Bool) = WhenSym1 a6989586621679963138 f6989586621679962753 :: TyFun (f6989586621679962753 ()) (f6989586621679962753 ()) -> Type
type Apply (UnlessSym0 :: TyFun Bool (f6989586621681401670 () ~> f6989586621681401670 ()) -> Type) (a6989586621681402022 :: Bool) 
Instance details

Defined in Data.Singletons.Prelude.Monad

type Apply (UnlessSym0 :: TyFun Bool (f6989586621681401670 () ~> f6989586621681401670 ()) -> Type) (a6989586621681402022 :: Bool) = UnlessSym1 a6989586621681402022 f6989586621681401670 :: TyFun (f6989586621681401670 ()) (f6989586621681401670 ()) -> Type
type Apply (ListelemSym0 :: TyFun a6989586621680686793 ([a6989586621680686793] ~> Bool) -> Type) (a6989586621680687700 :: a6989586621680686793) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

type Apply (ListelemSym0 :: TyFun a6989586621680686793 ([a6989586621680686793] ~> Bool) -> Type) (a6989586621680687700 :: a6989586621680686793) = ListelemSym1 a6989586621680687700
type Apply (NotElemSym0 :: TyFun a6989586621680316399 ([a6989586621680316399] ~> Bool) -> Type) (a6989586621680321269 :: a6989586621680316399) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (NotElemSym0 :: TyFun a6989586621680316399 ([a6989586621680316399] ~> Bool) -> Type) (a6989586621680321269 :: a6989586621680316399) = NotElemSym1 a6989586621680321269
type Apply (ElemSym0 :: TyFun a6989586621680316400 ([a6989586621680316400] ~> Bool) -> Type) (a6989586621680321276 :: a6989586621680316400) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (ElemSym0 :: TyFun a6989586621680316400 ([a6989586621680316400] ~> Bool) -> Type) (a6989586621680321276 :: a6989586621680316400) = ElemSym1 a6989586621680321276
type Apply (Let6989586621680734291Scrutinee_6989586621680734254Sym0 :: TyFun k1 (TyFun k1 Bool -> Type) -> Type) (x6989586621680734284 :: k1) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Let6989586621680734291Scrutinee_6989586621680734254Sym0 :: TyFun k1 (TyFun k1 Bool -> Type) -> Type) (x6989586621680734284 :: k1) = Let6989586621680734291Scrutinee_6989586621680734254Sym1 x6989586621680734284
type Apply (Let6989586621680734318Scrutinee_6989586621680734256Sym0 :: TyFun k1 (TyFun k1 Bool -> Type) -> Type) (x6989586621680734311 :: k1) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Let6989586621680734318Scrutinee_6989586621680734256Sym0 :: TyFun k1 (TyFun k1 Bool -> Type) -> Type) (x6989586621680734311 :: k1) = Let6989586621680734318Scrutinee_6989586621680734256Sym1 x6989586621680734311
type Apply ((==@#@$) :: TyFun a6989586621679774975 (a6989586621679774975 ~> Bool) -> Type) (x6989586621679774976 :: a6989586621679774975) 
Instance details

Defined in Data.Singletons.Prelude.Eq

type Apply ((==@#@$) :: TyFun a6989586621679774975 (a6989586621679774975 ~> Bool) -> Type) (x6989586621679774976 :: a6989586621679774975) = (==@#@$$) x6989586621679774976
type Apply ((/=@#@$) :: TyFun a6989586621679774975 (a6989586621679774975 ~> Bool) -> Type) (x6989586621679774978 :: a6989586621679774975) 
Instance details

Defined in Data.Singletons.Prelude.Eq

type Apply ((/=@#@$) :: TyFun a6989586621679774975 (a6989586621679774975 ~> Bool) -> Type) (x6989586621679774978 :: a6989586621679774975) = (/=@#@$$) x6989586621679774978
type Apply (DefaultEqSym0 :: TyFun k6989586621679774969 (k6989586621679774969 ~> Bool) -> Type) (a6989586621679774970 :: k6989586621679774969) 
Instance details

Defined in Data.Singletons.Prelude.Eq

type Apply (DefaultEqSym0 :: TyFun k6989586621679774969 (k6989586621679774969 ~> Bool) -> Type) (a6989586621679774970 :: k6989586621679774969) = DefaultEqSym1 a6989586621679774970
type Apply (Bool_Sym0 :: TyFun a6989586621679771144 (a6989586621679771144 ~> (Bool ~> a6989586621679771144)) -> Type) (a6989586621679771150 :: a6989586621679771144) 
Instance details

Defined in Data.Singletons.Prelude.Bool

type Apply (Bool_Sym0 :: TyFun a6989586621679771144 (a6989586621679771144 ~> (Bool ~> a6989586621679771144)) -> Type) (a6989586621679771150 :: a6989586621679771144) = Bool_Sym1 a6989586621679771150
type Apply (Let6989586621679792508Scrutinee_6989586621679792399Sym0 :: TyFun k1 (TyFun k1 Bool -> Type) -> Type) (x6989586621679792506 :: k1) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Apply (Let6989586621679792508Scrutinee_6989586621679792399Sym0 :: TyFun k1 (TyFun k1 Bool -> Type) -> Type) (x6989586621679792506 :: k1) = Let6989586621679792508Scrutinee_6989586621679792399Sym1 x6989586621679792506
type Apply (TFHelper_6989586621679792578Sym0 :: TyFun a6989586621679792381 (a6989586621679792381 ~> Bool) -> Type) (a6989586621679792576 :: a6989586621679792381) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Apply (TFHelper_6989586621679792578Sym0 :: TyFun a6989586621679792381 (a6989586621679792381 ~> Bool) -> Type) (a6989586621679792576 :: a6989586621679792381) = TFHelper_6989586621679792578Sym1 a6989586621679792576
type Apply (TFHelper_6989586621679792560Sym0 :: TyFun a6989586621679792381 (a6989586621679792381 ~> Bool) -> Type) (a6989586621679792558 :: a6989586621679792381) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Apply (TFHelper_6989586621679792560Sym0 :: TyFun a6989586621679792381 (a6989586621679792381 ~> Bool) -> Type) (a6989586621679792558 :: a6989586621679792381) = TFHelper_6989586621679792560Sym1 a6989586621679792558
type Apply (TFHelper_6989586621679792542Sym0 :: TyFun a6989586621679792381 (a6989586621679792381 ~> Bool) -> Type) (a6989586621679792540 :: a6989586621679792381) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Apply (TFHelper_6989586621679792542Sym0 :: TyFun a6989586621679792381 (a6989586621679792381 ~> Bool) -> Type) (a6989586621679792540 :: a6989586621679792381) = TFHelper_6989586621679792542Sym1 a6989586621679792540
type Apply (TFHelper_6989586621679792524Sym0 :: TyFun a6989586621679792381 (a6989586621679792381 ~> Bool) -> Type) (a6989586621679792522 :: a6989586621679792381) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Apply (TFHelper_6989586621679792524Sym0 :: TyFun a6989586621679792381 (a6989586621679792381 ~> Bool) -> Type) (a6989586621679792522 :: a6989586621679792381) = TFHelper_6989586621679792524Sym1 a6989586621679792522
type Apply ((<=@#@$) :: TyFun a6989586621679792381 (a6989586621679792381 ~> Bool) -> Type) (arg6989586621679792478 :: a6989586621679792381) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Apply ((<=@#@$) :: TyFun a6989586621679792381 (a6989586621679792381 ~> Bool) -> Type) (arg6989586621679792478 :: a6989586621679792381) = (<=@#@$$) arg6989586621679792478
type Apply ((>=@#@$) :: TyFun a6989586621679792381 (a6989586621679792381 ~> Bool) -> Type) (arg6989586621679792486 :: a6989586621679792381) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Apply ((>=@#@$) :: TyFun a6989586621679792381 (a6989586621679792381 ~> Bool) -> Type) (arg6989586621679792486 :: a6989586621679792381) = (>=@#@$$) arg6989586621679792486
type Apply ((>@#@$) :: TyFun a6989586621679792381 (a6989586621679792381 ~> Bool) -> Type) (arg6989586621679792482 :: a6989586621679792381) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Apply ((>@#@$) :: TyFun a6989586621679792381 (a6989586621679792381 ~> Bool) -> Type) (arg6989586621679792482 :: a6989586621679792381) = (>@#@$$) arg6989586621679792482
type Apply (Let6989586621679792622Scrutinee_6989586621679792413Sym0 :: TyFun k1 (TyFun k1 Bool -> Type) -> Type) (x6989586621679792620 :: k1) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Apply (Let6989586621679792622Scrutinee_6989586621679792413Sym0 :: TyFun k1 (TyFun k1 Bool -> Type) -> Type) (x6989586621679792620 :: k1) = Let6989586621679792622Scrutinee_6989586621679792413Sym1 x6989586621679792620
type Apply (Let6989586621679792604Scrutinee_6989586621679792411Sym0 :: TyFun k1 (TyFun k1 Bool -> Type) -> Type) (x6989586621679792602 :: k1) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Apply (Let6989586621679792604Scrutinee_6989586621679792411Sym0 :: TyFun k1 (TyFun k1 Bool -> Type) -> Type) (x6989586621679792602 :: k1) = Let6989586621679792604Scrutinee_6989586621679792411Sym1 x6989586621679792602
type Apply (Let6989586621679792513Scrutinee_6989586621679792401Sym0 :: TyFun k1 (TyFun k1 Bool -> Type) -> Type) (x6989586621679792506 :: k1) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Apply (Let6989586621679792513Scrutinee_6989586621679792401Sym0 :: TyFun k1 (TyFun k1 Bool -> Type) -> Type) (x6989586621679792506 :: k1) = Let6989586621679792513Scrutinee_6989586621679792401Sym1 x6989586621679792506
type Apply ((<@#@$) :: TyFun a6989586621679792381 (a6989586621679792381 ~> Bool) -> Type) (arg6989586621679792474 :: a6989586621679792381) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Apply ((<@#@$) :: TyFun a6989586621679792381 (a6989586621679792381 ~> Bool) -> Type) (arg6989586621679792474 :: a6989586621679792381) = (<@#@$$) arg6989586621679792474
type Apply (Elem_6989586621680921217Sym0 :: TyFun a6989586621680742398 (Identity a6989586621680742398 ~> Bool) -> Type) (a6989586621680921215 :: a6989586621680742398) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type Apply (Elem_6989586621680921217Sym0 :: TyFun a6989586621680742398 (Identity a6989586621680742398 ~> Bool) -> Type) (a6989586621680921215 :: a6989586621680742398) = Elem_6989586621680921217Sym1 a6989586621680921215
type Apply (Let6989586621680320493Scrutinee_6989586621680317017Sym0 :: TyFun k1 (TyFun k Bool -> Type) -> Type) (n6989586621680320491 :: k1) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (Let6989586621680320493Scrutinee_6989586621680317017Sym0 :: TyFun k1 (TyFun k Bool -> Type) -> Type) (n6989586621680320491 :: k1) = Let6989586621680320493Scrutinee_6989586621680317017Sym1 n6989586621680320491 :: TyFun k Bool -> Type
type Apply (Elem_bySym1 a6989586621680320412 :: TyFun a6989586621680316317 ([a6989586621680316317] ~> Bool) -> Type) (a6989586621680320413 :: a6989586621680316317) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (Elem_bySym1 a6989586621680320412 :: TyFun a6989586621680316317 ([a6989586621680316317] ~> Bool) -> Type) (a6989586621680320413 :: a6989586621680316317) = Elem_bySym2 a6989586621680320412 a6989586621680320413
type Apply (Elem_6989586621680743293Sym0 :: TyFun a6989586621680742398 (t6989586621680742381 a6989586621680742398 ~> Bool) -> Type) (a6989586621680743291 :: a6989586621680742398) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Elem_6989586621680743293Sym0 :: TyFun a6989586621680742398 (t6989586621680742381 a6989586621680742398 ~> Bool) -> Type) (a6989586621680743291 :: a6989586621680742398) = Elem_6989586621680743293Sym1 a6989586621680743291 t6989586621680742381 :: TyFun (t6989586621680742381 a6989586621680742398) Bool -> Type
type Apply (ElemSym0 :: TyFun a6989586621680742398 (t6989586621680742381 a6989586621680742398 ~> Bool) -> Type) (arg6989586621680743044 :: a6989586621680742398) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (ElemSym0 :: TyFun a6989586621680742398 (t6989586621680742381 a6989586621680742398 ~> Bool) -> Type) (arg6989586621680743044 :: a6989586621680742398) = ElemSym1 arg6989586621680743044 t6989586621680742381 :: TyFun (t6989586621680742381 a6989586621680742398) Bool -> Type
type Apply (NotElemSym0 :: TyFun a6989586621680742292 (t6989586621680742291 a6989586621680742292 ~> Bool) -> Type) (a6989586621680742770 :: a6989586621680742292) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (NotElemSym0 :: TyFun a6989586621680742292 (t6989586621680742291 a6989586621680742292 ~> Bool) -> Type) (a6989586621680742770 :: a6989586621680742292) = NotElemSym1 a6989586621680742770 t6989586621680742291 :: TyFun (t6989586621680742291 a6989586621680742292) Bool -> Type
type Apply (Elem_6989586621680743413Sym0 :: TyFun a6989586621680742398 (t6989586621680742381 a6989586621680742398 ~> Bool) -> Type) (a6989586621680743411 :: a6989586621680742398) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Elem_6989586621680743413Sym0 :: TyFun a6989586621680742398 (t6989586621680742381 a6989586621680742398 ~> Bool) -> Type) (a6989586621680743411 :: a6989586621680742398) = Elem_6989586621680743413Sym1 a6989586621680743411 t6989586621680742381 :: TyFun (t6989586621680742381 a6989586621680742398) Bool -> Type
type Apply (Elem_6989586621680743754Sym0 :: TyFun a6989586621680742398 (t6989586621680742381 a6989586621680742398 ~> Bool) -> Type) (a6989586621680743752 :: a6989586621680742398) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Elem_6989586621680743754Sym0 :: TyFun a6989586621680742398 (t6989586621680742381 a6989586621680742398 ~> Bool) -> Type) (a6989586621680743752 :: a6989586621680742398) = Elem_6989586621680743754Sym1 a6989586621680743752 t6989586621680742381 :: TyFun (t6989586621680742381 a6989586621680742398) Bool -> Type
type Apply (Elem_6989586621680743921Sym0 :: TyFun a6989586621680742398 (t6989586621680742381 a6989586621680742398 ~> Bool) -> Type) (a6989586621680743919 :: a6989586621680742398) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Elem_6989586621680743921Sym0 :: TyFun a6989586621680742398 (t6989586621680742381 a6989586621680742398 ~> Bool) -> Type) (a6989586621680743919 :: a6989586621680742398) = Elem_6989586621680743921Sym1 a6989586621680743919 t6989586621680742381 :: TyFun (t6989586621680742381 a6989586621680742398) Bool -> Type
type Apply (Elem_6989586621680744088Sym0 :: TyFun a6989586621680742398 (t6989586621680742381 a6989586621680742398 ~> Bool) -> Type) (a6989586621680744086 :: a6989586621680742398) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Elem_6989586621680744088Sym0 :: TyFun a6989586621680742398 (t6989586621680742381 a6989586621680742398 ~> Bool) -> Type) (a6989586621680744086 :: a6989586621680742398) = Elem_6989586621680744088Sym1 a6989586621680744086 t6989586621680742381 :: TyFun (t6989586621680742381 a6989586621680742398) Bool -> Type
type Apply (Bool_Sym1 a6989586621679771150 :: TyFun a6989586621679771144 (Bool ~> a6989586621679771144) -> Type) (a6989586621679771151 :: a6989586621679771144) 
Instance details

Defined in Data.Singletons.Prelude.Bool

type Apply (Bool_Sym1 a6989586621679771150 :: TyFun a6989586621679771144 (Bool ~> a6989586621679771144) -> Type) (a6989586621679771151 :: a6989586621679771144) = Bool_Sym2 a6989586621679771150 a6989586621679771151
type Apply (Let6989586621680320474Scrutinee_6989586621680317019Sym0 :: TyFun k1 (TyFun k2 (TyFun k3 Bool -> Type) -> Type) -> Type) (x6989586621680320471 :: k1) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (Let6989586621680320474Scrutinee_6989586621680317019Sym0 :: TyFun k1 (TyFun k2 (TyFun k3 Bool -> Type) -> Type) -> Type) (x6989586621680320471 :: k1) = Let6989586621680320474Scrutinee_6989586621680317019Sym1 x6989586621680320471 :: TyFun k2 (TyFun k3 Bool -> Type) -> Type
type Apply (Let6989586621680320561Scrutinee_6989586621680317013Sym0 :: TyFun k1 (TyFun k1 (TyFun k2 (TyFun k3 Bool -> Type) -> Type) -> Type) -> Type) (key6989586621680320557 :: k1) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (Let6989586621680320561Scrutinee_6989586621680317013Sym0 :: TyFun k1 (TyFun k1 (TyFun k2 (TyFun k3 Bool -> Type) -> Type) -> Type) -> Type) (key6989586621680320557 :: k1) = Let6989586621680320561Scrutinee_6989586621680317013Sym1 key6989586621680320557 :: TyFun k1 (TyFun k2 (TyFun k3 Bool -> Type) -> Type) -> Type
type Apply (Let6989586621680320641Scrutinee_6989586621680317003Sym0 :: TyFun k1 (TyFun k2 (TyFun k3 Bool -> Type) -> Type) -> Type) (n6989586621680320638 :: k1) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (Let6989586621680320641Scrutinee_6989586621680317003Sym0 :: TyFun k1 (TyFun k2 (TyFun k3 Bool -> Type) -> Type) -> Type) (n6989586621680320638 :: k1) = Let6989586621680320641Scrutinee_6989586621680317003Sym1 n6989586621680320638 :: TyFun k2 (TyFun k3 Bool -> Type) -> Type
type Apply (Let6989586621680320655Scrutinee_6989586621680317001Sym0 :: TyFun k1 (TyFun k2 (TyFun k3 Bool -> Type) -> Type) -> Type) (n6989586621680320652 :: k1) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (Let6989586621680320655Scrutinee_6989586621680317001Sym0 :: TyFun k1 (TyFun k2 (TyFun k3 Bool -> Type) -> Type) -> Type) (n6989586621680320652 :: k1) = Let6989586621680320655Scrutinee_6989586621680317001Sym1 n6989586621680320652 :: TyFun k2 (TyFun k3 Bool -> Type) -> Type
type Apply (Let6989586621680320438Scrutinee_6989586621680317023Sym0 :: TyFun k1 (TyFun k2 (TyFun [k1] (TyFun (k1 ~> (k1 ~> Bool)) (TyFun k3 Bool -> Type) -> Type) -> Type) -> Type) -> Type) (y6989586621680320435 :: k1) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (Let6989586621680320438Scrutinee_6989586621680317023Sym0 :: TyFun k1 (TyFun k2 (TyFun [k1] (TyFun (k1 ~> (k1 ~> Bool)) (TyFun k3 Bool -> Type) -> Type) -> Type) -> Type) -> Type) (y6989586621680320435 :: k1) = Let6989586621680320438Scrutinee_6989586621680317023Sym1 y6989586621680320435 :: TyFun k2 (TyFun [k1] (TyFun (k1 ~> (k1 ~> Bool)) (TyFun k3 Bool -> Type) -> Type) -> Type) -> Type
type Apply (Let6989586621680320459Scrutinee_6989586621680317021Sym0 :: TyFun k1 (TyFun k2 (TyFun [k1] (TyFun k3 Bool -> Type) -> Type) -> Type) -> Type) (x6989586621680320456 :: k1) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (Let6989586621680320459Scrutinee_6989586621680317021Sym0 :: TyFun k1 (TyFun k2 (TyFun [k1] (TyFun k3 Bool -> Type) -> Type) -> Type) -> Type) (x6989586621680320456 :: k1) = Let6989586621680320459Scrutinee_6989586621680317021Sym1 x6989586621680320456 :: TyFun k2 (TyFun [k1] (TyFun k3 Bool -> Type) -> Type) -> Type
type Apply (Let6989586621680320760Scrutinee_6989586621680316995Sym0 :: TyFun k1 (TyFun [a6989586621680316437] (TyFun (k1 ~> Bool) (TyFun k Bool -> Type) -> Type) -> Type) -> Type) (x6989586621680320758 :: k1) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (Let6989586621680320760Scrutinee_6989586621680316995Sym0 :: TyFun k1 (TyFun [a6989586621680316437] (TyFun (k1 ~> Bool) (TyFun k Bool -> Type) -> Type) -> Type) -> Type) (x6989586621680320758 :: k1) = Let6989586621680320760Scrutinee_6989586621680316995Sym1 x6989586621680320758 :: TyFun [a6989586621680316437] (TyFun (k1 ~> Bool) (TyFun k Bool -> Type) -> Type) -> Type
type Apply (Lambda_6989586621680743256Sym0 :: TyFun k1 (TyFun k2 (TyFun k3 Bool -> Type) -> Type) -> Type) (a_69895866216807432516989586621680743255 :: k1) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Lambda_6989586621680743256Sym0 :: TyFun k1 (TyFun k2 (TyFun k3 Bool -> Type) -> Type) -> Type) (a_69895866216807432516989586621680743255 :: k1) = Lambda_6989586621680743256Sym1 a_69895866216807432516989586621680743255 :: TyFun k2 (TyFun k3 Bool -> Type) -> Type
type Apply (Lambda_6989586621681402162Sym0 :: TyFun k1 (TyFun k2 (TyFun k3 (TyFun Bool (TyFun [k1] [k1] -> Type) -> Type) -> Type) -> Type) -> Type) (x6989586621681402161 :: k1) 
Instance details

Defined in Data.Singletons.Prelude.Monad

type Apply (Lambda_6989586621681402162Sym0 :: TyFun k1 (TyFun k2 (TyFun k3 (TyFun Bool (TyFun [k1] [k1] -> Type) -> Type) -> Type) -> Type) -> Type) (x6989586621681402161 :: k1) = Lambda_6989586621681402162Sym1 x6989586621681402161 :: TyFun k2 (TyFun k3 (TyFun Bool (TyFun [k1] [k1] -> Type) -> Type) -> Type) -> Type
type Apply (Let6989586621680320474Scrutinee_6989586621680317019Sym1 x6989586621680320471 :: TyFun k2 (TyFun k3 Bool -> Type) -> Type) (xs6989586621680320472 :: k2) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (Let6989586621680320474Scrutinee_6989586621680317019Sym1 x6989586621680320471 :: TyFun k2 (TyFun k3 Bool -> Type) -> Type) (xs6989586621680320472 :: k2) = Let6989586621680320474Scrutinee_6989586621680317019Sym2 x6989586621680320471 xs6989586621680320472 :: TyFun k3 Bool -> Type
type Apply (Let6989586621680320561Scrutinee_6989586621680317013Sym1 key6989586621680320557 :: TyFun k1 (TyFun k2 (TyFun k3 Bool -> Type) -> Type) -> Type) (x6989586621680320558 :: k1) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (Let6989586621680320561Scrutinee_6989586621680317013Sym1 key6989586621680320557 :: TyFun k1 (TyFun k2 (TyFun k3 Bool -> Type) -> Type) -> Type) (x6989586621680320558 :: k1) = Let6989586621680320561Scrutinee_6989586621680317013Sym2 key6989586621680320557 x6989586621680320558 :: TyFun k2 (TyFun k3 Bool -> Type) -> Type
type Apply (Let6989586621680320641Scrutinee_6989586621680317003Sym1 n6989586621680320638 :: TyFun k2 (TyFun k3 Bool -> Type) -> Type) (x6989586621680320639 :: k2) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (Let6989586621680320641Scrutinee_6989586621680317003Sym1 n6989586621680320638 :: TyFun k2 (TyFun k3 Bool -> Type) -> Type) (x6989586621680320639 :: k2) = Let6989586621680320641Scrutinee_6989586621680317003Sym2 n6989586621680320638 x6989586621680320639 :: TyFun k3 Bool -> Type
type Apply (Let6989586621680320655Scrutinee_6989586621680317001Sym1 n6989586621680320652 :: TyFun k2 (TyFun k3 Bool -> Type) -> Type) (x6989586621680320653 :: k2) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (Let6989586621680320655Scrutinee_6989586621680317001Sym1 n6989586621680320652 :: TyFun k2 (TyFun k3 Bool -> Type) -> Type) (x6989586621680320653 :: k2) = Let6989586621680320655Scrutinee_6989586621680317001Sym2 n6989586621680320652 x6989586621680320653 :: TyFun k3 Bool -> Type
type Apply (Let6989586621680320438Scrutinee_6989586621680317023Sym1 y6989586621680320435 :: TyFun k2 (TyFun [k1] (TyFun (k1 ~> (k1 ~> Bool)) (TyFun k3 Bool -> Type) -> Type) -> Type) -> Type) (ys6989586621680320436 :: k2) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (Let6989586621680320438Scrutinee_6989586621680317023Sym1 y6989586621680320435 :: TyFun k2 (TyFun [k1] (TyFun (k1 ~> (k1 ~> Bool)) (TyFun k3 Bool -> Type) -> Type) -> Type) -> Type) (ys6989586621680320436 :: k2) = Let6989586621680320438Scrutinee_6989586621680317023Sym2 y6989586621680320435 ys6989586621680320436 :: TyFun [k1] (TyFun (k1 ~> (k1 ~> Bool)) (TyFun k3 Bool -> Type) -> Type) -> Type
type Apply (Let6989586621680320459Scrutinee_6989586621680317021Sym1 x6989586621680320456 :: TyFun k2 (TyFun [k1] (TyFun k3 Bool -> Type) -> Type) -> Type) (xs6989586621680320457 :: k2) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (Let6989586621680320459Scrutinee_6989586621680317021Sym1 x6989586621680320456 :: TyFun k2 (TyFun [k1] (TyFun k3 Bool -> Type) -> Type) -> Type) (xs6989586621680320457 :: k2) = Let6989586621680320459Scrutinee_6989586621680317021Sym2 x6989586621680320456 xs6989586621680320457 :: TyFun [k1] (TyFun k3 Bool -> Type) -> Type
type Apply (Lambda_6989586621680743256Sym1 a_69895866216807432516989586621680743255 :: TyFun k2 (TyFun k3 Bool -> Type) -> Type) (t6989586621680743263 :: k2) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Lambda_6989586621680743256Sym1 a_69895866216807432516989586621680743255 :: TyFun k2 (TyFun k3 Bool -> Type) -> Type) (t6989586621680743263 :: k2) = Lambda_6989586621680743256Sym2 a_69895866216807432516989586621680743255 t6989586621680743263 :: TyFun k3 Bool -> Type
type Apply (Let6989586621680129192Scrutinee_6989586621680128958Sym0 :: TyFun k1 (TyFun k2 (TyFun k1 (TyFun k3 (TyFun k4 Bool -> Type) -> Type) -> Type) -> Type) -> Type) (x6989586621680129191 :: k1) 
Instance details

Defined in Data.Singletons.Prelude.Enum

type Apply (Let6989586621680129192Scrutinee_6989586621680128958Sym0 :: TyFun k1 (TyFun k2 (TyFun k1 (TyFun k3 (TyFun k4 Bool -> Type) -> Type) -> Type) -> Type) -> Type) (x6989586621680129191 :: k1) = Let6989586621680129192Scrutinee_6989586621680128958Sym1 x6989586621680129191 :: TyFun k2 (TyFun k1 (TyFun k3 (TyFun k4 Bool -> Type) -> Type) -> Type) -> Type
type Apply (Lambda_6989586621681402162Sym1 x6989586621681402161 :: TyFun k2 (TyFun k3 (TyFun Bool (TyFun [k1] [k1] -> Type) -> Type) -> Type) -> Type) (p6989586621681402157 :: k2) 
Instance details

Defined in Data.Singletons.Prelude.Monad

type Apply (Lambda_6989586621681402162Sym1 x6989586621681402161 :: TyFun k2 (TyFun k3 (TyFun Bool (TyFun [k1] [k1] -> Type) -> Type) -> Type) -> Type) (p6989586621681402157 :: k2) = Lambda_6989586621681402162Sym2 x6989586621681402161 p6989586621681402157 :: TyFun k3 (TyFun Bool (TyFun [k1] [k1] -> Type) -> Type) -> Type
type Apply (Let6989586621680320561Scrutinee_6989586621680317013Sym2 x6989586621680320558 key6989586621680320557 :: TyFun k2 (TyFun k3 Bool -> Type) -> Type) (y6989586621680320559 :: k2) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (Let6989586621680320561Scrutinee_6989586621680317013Sym2 x6989586621680320558 key6989586621680320557 :: TyFun k2 (TyFun k3 Bool -> Type) -> Type) (y6989586621680320559 :: k2) = Let6989586621680320561Scrutinee_6989586621680317013Sym3 x6989586621680320558 key6989586621680320557 y6989586621680320559 :: TyFun k3 Bool -> Type
type Apply (Let6989586621680129058Scrutinee_6989586621680128982Sym0 :: TyFun k1 (TyFun k2 (TyFun k1 (TyFun k3 (TyFun k4 (TyFun k5 Bool -> Type) -> Type) -> Type) -> Type) -> Type) -> Type) (x16989586621680129053 :: k1) 
Instance details

Defined in Data.Singletons.Prelude.Enum

type Apply (Let6989586621680129058Scrutinee_6989586621680128982Sym0 :: TyFun k1 (TyFun k2 (TyFun k1 (TyFun k3 (TyFun k4 (TyFun k5 Bool -> Type) -> Type) -> Type) -> Type) -> Type) -> Type) (x16989586621680129053 :: k1) = Let6989586621680129058Scrutinee_6989586621680128982Sym1 x16989586621680129053 :: TyFun k2 (TyFun k1 (TyFun k3 (TyFun k4 (TyFun k5 Bool -> Type) -> Type) -> Type) -> Type) -> Type
type Apply (Let6989586621680129115Scrutinee_6989586621680128972Sym0 :: TyFun k1 (TyFun k2 (TyFun k1 (TyFun k3 (TyFun k4 (TyFun k5 Bool -> Type) -> Type) -> Type) -> Type) -> Type) -> Type) (x16989586621680129110 :: k1) 
Instance details

Defined in Data.Singletons.Prelude.Enum

type Apply (Let6989586621680129115Scrutinee_6989586621680128972Sym0 :: TyFun k1 (TyFun k2 (TyFun k1 (TyFun k3 (TyFun k4 (TyFun k5 Bool -> Type) -> Type) -> Type) -> Type) -> Type) -> Type) (x16989586621680129110 :: k1) = Let6989586621680129115Scrutinee_6989586621680128972Sym1 x16989586621680129110 :: TyFun k2 (TyFun k1 (TyFun k3 (TyFun k4 (TyFun k5 Bool -> Type) -> Type) -> Type) -> Type) -> Type
type Apply (Let6989586621680129192Scrutinee_6989586621680128958Sym1 x6989586621680129191 :: TyFun k2 (TyFun k1 (TyFun k3 (TyFun k4 Bool -> Type) -> Type) -> Type) -> Type) (x06989586621680129182 :: k2) 
Instance details

Defined in Data.Singletons.Prelude.Enum

type Apply (Let6989586621680129192Scrutinee_6989586621680128958Sym1 x6989586621680129191 :: TyFun k2 (TyFun k1 (TyFun k3 (TyFun k4 Bool -> Type) -> Type) -> Type) -> Type) (x06989586621680129182 :: k2) = Let6989586621680129192Scrutinee_6989586621680128958Sym2 x6989586621680129191 x06989586621680129182 :: TyFun k1 (TyFun k3 (TyFun k4 Bool -> Type) -> Type) -> Type
type Apply (Lambda_6989586621681402162Sym2 p6989586621681402157 x6989586621681402161 :: TyFun k3 (TyFun Bool (TyFun [k1] [k1] -> Type) -> Type) -> Type) (a_69895866216814021556989586621681402158 :: k3) 
Instance details

Defined in Data.Singletons.Prelude.Monad

type Apply (Lambda_6989586621681402162Sym2 p6989586621681402157 x6989586621681402161 :: TyFun k3 (TyFun Bool (TyFun [k1] [k1] -> Type) -> Type) -> Type) (a_69895866216814021556989586621681402158 :: k3) = Lambda_6989586621681402162Sym3 p6989586621681402157 x6989586621681402161 a_69895866216814021556989586621681402158
type Apply (Lambda_6989586621681402162Sym3 a_69895866216814021556989586621681402158 p6989586621681402157 x6989586621681402161 :: TyFun Bool (TyFun [k1] [k1] -> Type) -> Type) (t6989586621681402168 :: Bool) 
Instance details

Defined in Data.Singletons.Prelude.Monad

type Apply (Lambda_6989586621681402162Sym3 a_69895866216814021556989586621681402158 p6989586621681402157 x6989586621681402161 :: TyFun Bool (TyFun [k1] [k1] -> Type) -> Type) (t6989586621681402168 :: Bool) = Lambda_6989586621681402162 a_69895866216814021556989586621681402158 p6989586621681402157 x6989586621681402161 t6989586621681402168
type Apply (Let6989586621680129058Scrutinee_6989586621680128982Sym1 x16989586621680129053 :: TyFun k2 (TyFun k1 (TyFun k3 (TyFun k4 (TyFun k5 Bool -> Type) -> Type) -> Type) -> Type) -> Type) (x26989586621680129054 :: k2) 
Instance details

Defined in Data.Singletons.Prelude.Enum

type Apply (Let6989586621680129058Scrutinee_6989586621680128982Sym1 x16989586621680129053 :: TyFun k2 (TyFun k1 (TyFun k3 (TyFun k4 (TyFun k5 Bool -> Type) -> Type) -> Type) -> Type) -> Type) (x26989586621680129054 :: k2) = Let6989586621680129058Scrutinee_6989586621680128982Sym2 x16989586621680129053 x26989586621680129054 :: TyFun k1 (TyFun k3 (TyFun k4 (TyFun k5 Bool -> Type) -> Type) -> Type) -> Type
type Apply (Let6989586621680129115Scrutinee_6989586621680128972Sym1 x16989586621680129110 :: TyFun k2 (TyFun k1 (TyFun k3 (TyFun k4 (TyFun k5 Bool -> Type) -> Type) -> Type) -> Type) -> Type) (x26989586621680129111 :: k2) 
Instance details

Defined in Data.Singletons.Prelude.Enum

type Apply (Let6989586621680129115Scrutinee_6989586621680128972Sym1 x16989586621680129110 :: TyFun k2 (TyFun k1 (TyFun k3 (TyFun k4 (TyFun k5 Bool -> Type) -> Type) -> Type) -> Type) -> Type) (x26989586621680129111 :: k2) = Let6989586621680129115Scrutinee_6989586621680128972Sym2 x16989586621680129110 x26989586621680129111 :: TyFun k1 (TyFun k3 (TyFun k4 (TyFun k5 Bool -> Type) -> Type) -> Type) -> Type
type Apply (Let6989586621680129192Scrutinee_6989586621680128958Sym2 x06989586621680129182 x6989586621680129191 :: TyFun k1 (TyFun k3 (TyFun k4 Bool -> Type) -> Type) -> Type) (y6989586621680129183 :: k1) 
Instance details

Defined in Data.Singletons.Prelude.Enum

type Apply (Let6989586621680129192Scrutinee_6989586621680128958Sym2 x06989586621680129182 x6989586621680129191 :: TyFun k1 (TyFun k3 (TyFun k4 Bool -> Type) -> Type) -> Type) (y6989586621680129183 :: k1) = Let6989586621680129192Scrutinee_6989586621680128958Sym3 x06989586621680129182 x6989586621680129191 y6989586621680129183 :: TyFun k3 (TyFun k4 Bool -> Type) -> Type
type Apply (Let6989586621680129058Scrutinee_6989586621680128982Sym2 x26989586621680129054 x16989586621680129053 :: TyFun k1 (TyFun k3 (TyFun k4 (TyFun k5 Bool -> Type) -> Type) -> Type) -> Type) (y6989586621680129055 :: k1) 
Instance details

Defined in Data.Singletons.Prelude.Enum

type Apply (Let6989586621680129058Scrutinee_6989586621680128982Sym2 x26989586621680129054 x16989586621680129053 :: TyFun k1 (TyFun k3 (TyFun k4 (TyFun k5 Bool -> Type) -> Type) -> Type) -> Type) (y6989586621680129055 :: k1) = Let6989586621680129058Scrutinee_6989586621680128982Sym3 x26989586621680129054 x16989586621680129053 y6989586621680129055 :: TyFun k3 (TyFun k4 (TyFun k5 Bool -> Type) -> Type) -> Type
type Apply (Let6989586621680129115Scrutinee_6989586621680128972Sym2 x26989586621680129111 x16989586621680129110 :: TyFun k1 (TyFun k3 (TyFun k4 (TyFun k5 Bool -> Type) -> Type) -> Type) -> Type) (y6989586621680129112 :: k1) 
Instance details

Defined in Data.Singletons.Prelude.Enum

type Apply (Let6989586621680129115Scrutinee_6989586621680128972Sym2 x26989586621680129111 x16989586621680129110 :: TyFun k1 (TyFun k3 (TyFun k4 (TyFun k5 Bool -> Type) -> Type) -> Type) -> Type) (y6989586621680129112 :: k1) = Let6989586621680129115Scrutinee_6989586621680128972Sym3 x26989586621680129111 x16989586621680129110 y6989586621680129112 :: TyFun k3 (TyFun k4 (TyFun k5 Bool -> Type) -> Type) -> Type
type Apply (Let6989586621680129192Scrutinee_6989586621680128958Sym3 y6989586621680129183 x06989586621680129182 x6989586621680129191 :: TyFun k3 (TyFun k4 Bool -> Type) -> Type) (arg_69895866216801289546989586621680129178 :: k3) 
Instance details

Defined in Data.Singletons.Prelude.Enum

type Apply (Let6989586621680129192Scrutinee_6989586621680128958Sym3 y6989586621680129183 x06989586621680129182 x6989586621680129191 :: TyFun k3 (TyFun k4 Bool -> Type) -> Type) (arg_69895866216801289546989586621680129178 :: k3) = Let6989586621680129192Scrutinee_6989586621680128958Sym4 y6989586621680129183 x06989586621680129182 x6989586621680129191 arg_69895866216801289546989586621680129178 :: TyFun k4 Bool -> Type
type Apply (Let6989586621680129058Scrutinee_6989586621680128982Sym3 y6989586621680129055 x26989586621680129054 x16989586621680129053 :: TyFun k3 (TyFun k4 (TyFun k5 Bool -> Type) -> Type) -> Type) (arg_69895866216801289766989586621680129048 :: k3) 
Instance details

Defined in Data.Singletons.Prelude.Enum

type Apply (Let6989586621680129058Scrutinee_6989586621680128982Sym3 y6989586621680129055 x26989586621680129054 x16989586621680129053 :: TyFun k3 (TyFun k4 (TyFun k5 Bool -> Type) -> Type) -> Type) (arg_69895866216801289766989586621680129048 :: k3) = Let6989586621680129058Scrutinee_6989586621680128982Sym4 y6989586621680129055 x26989586621680129054 x16989586621680129053 arg_69895866216801289766989586621680129048 :: TyFun k4 (TyFun k5 Bool -> Type) -> Type
type Apply (Let6989586621680129115Scrutinee_6989586621680128972Sym3 y6989586621680129112 x26989586621680129111 x16989586621680129110 :: TyFun k3 (TyFun k4 (TyFun k5 Bool -> Type) -> Type) -> Type) (arg_69895866216801289666989586621680129105 :: k3) 
Instance details

Defined in Data.Singletons.Prelude.Enum

type Apply (Let6989586621680129115Scrutinee_6989586621680128972Sym3 y6989586621680129112 x26989586621680129111 x16989586621680129110 :: TyFun k3 (TyFun k4 (TyFun k5 Bool -> Type) -> Type) -> Type) (arg_69895866216801289666989586621680129105 :: k3) = Let6989586621680129115Scrutinee_6989586621680128972Sym4 y6989586621680129112 x26989586621680129111 x16989586621680129110 arg_69895866216801289666989586621680129105 :: TyFun k4 (TyFun k5 Bool -> Type) -> Type
type Apply (Let6989586621680129058Scrutinee_6989586621680128982Sym4 arg_69895866216801289766989586621680129048 y6989586621680129055 x26989586621680129054 x16989586621680129053 :: TyFun k4 (TyFun k5 Bool -> Type) -> Type) (arg_69895866216801289786989586621680129049 :: k4) 
Instance details

Defined in Data.Singletons.Prelude.Enum

type Apply (Let6989586621680129058Scrutinee_6989586621680128982Sym4 arg_69895866216801289766989586621680129048 y6989586621680129055 x26989586621680129054 x16989586621680129053 :: TyFun k4 (TyFun k5 Bool -> Type) -> Type) (arg_69895866216801289786989586621680129049 :: k4) = Let6989586621680129058Scrutinee_6989586621680128982Sym5 arg_69895866216801289766989586621680129048 y6989586621680129055 x26989586621680129054 x16989586621680129053 arg_69895866216801289786989586621680129049 :: TyFun k5 Bool -> Type
type Apply (Let6989586621680129115Scrutinee_6989586621680128972Sym4 arg_69895866216801289666989586621680129105 y6989586621680129112 x26989586621680129111 x16989586621680129110 :: TyFun k4 (TyFun k5 Bool -> Type) -> Type) (arg_69895866216801289686989586621680129106 :: k4) 
Instance details

Defined in Data.Singletons.Prelude.Enum

type Apply (Let6989586621680129115Scrutinee_6989586621680128972Sym4 arg_69895866216801289666989586621680129105 y6989586621680129112 x26989586621680129111 x16989586621680129110 :: TyFun k4 (TyFun k5 Bool -> Type) -> Type) (arg_69895866216801289686989586621680129106 :: k4) = Let6989586621680129115Scrutinee_6989586621680128972Sym5 arg_69895866216801289666989586621680129105 y6989586621680129112 x26989586621680129111 x16989586621680129110 arg_69895866216801289686989586621680129106 :: TyFun k5 Bool -> Type
type Eval (Elem a2 as :: Bool -> Type) 
Instance details

Defined in Fcf.Data.List

type Eval (Elem a2 as :: Bool -> Type) = Eval ((IsJust :: Maybe Nat -> Bool -> Type) =<< FindIndex (TyEq a2 :: a1 -> Bool -> Type) as)
type Eval (IsLeft ('Right _a :: Either a b) :: Bool -> Type) 
Instance details

Defined in Fcf.Data.Common

type Eval (IsLeft ('Right _a :: Either a b) :: Bool -> Type) = 'False
type Eval (IsLeft ('Left _a :: Either a b) :: Bool -> Type) 
Instance details

Defined in Fcf.Data.Common

type Eval (IsLeft ('Left _a :: Either a b) :: Bool -> Type) = 'True
type Eval (IsRight ('Right _a :: Either a b) :: Bool -> Type) 
Instance details

Defined in Fcf.Data.Common

type Eval (IsRight ('Right _a :: Either a b) :: Bool -> Type) = 'True
type Eval (IsRight ('Left _a :: Either a b) :: Bool -> Type) 
Instance details

Defined in Fcf.Data.Common

type Eval (IsRight ('Left _a :: Either a b) :: Bool -> Type) = 'False
type Eval (TyEq a b :: Bool -> Type) 
Instance details

Defined in Fcf.Utils

type Eval (TyEq a b :: Bool -> Type) = TyEqImpl a b
type Eval (TyEqSing a b :: Bool -> Type) 
Instance details

Defined in Util.Fcf

type Eval (TyEqSing a b :: Bool -> Type) = DefaultEq a b
type Eval (Guarded x ((p := y) ': ys) :: a2 -> Type) 
Instance details

Defined in Fcf.Data.Bool

type Eval (Guarded x ((p := y) ': ys) :: a2 -> Type) = Eval (If (Eval (p x)) y (Guarded x ys))
type Apply OrSym0 (a6989586621680321540 :: [Bool]) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply OrSym0 (a6989586621680321540 :: [Bool]) = Or a6989586621680321540
type Apply AndSym0 (a6989586621680321544 :: [Bool]) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply AndSym0 (a6989586621680321544 :: [Bool]) = And a6989586621680321544
type Apply (ListnullSym0 :: TyFun [a] Bool -> Type) (a6989586621680687618 :: [a]) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

type Apply (ListnullSym0 :: TyFun [a] Bool -> Type) (a6989586621680687618 :: [a]) = Listnull a6989586621680687618
type Apply (NullSym0 :: TyFun [a] Bool -> Type) (a6989586621680321764 :: [a]) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (NullSym0 :: TyFun [a] Bool -> Type) (a6989586621680321764 :: [a]) = Null a6989586621680321764
type Apply (IsNothingSym0 :: TyFun (Maybe a) Bool -> Type) (a6989586621679913596 :: Maybe a) 
Instance details

Defined in Data.Singletons.Prelude.Maybe

type Apply (IsNothingSym0 :: TyFun (Maybe a) Bool -> Type) (a6989586621679913596 :: Maybe a) = IsNothing a6989586621679913596
type Apply (IsJustSym0 :: TyFun (Maybe a) Bool -> Type) (a6989586621679913598 :: Maybe a) 
Instance details

Defined in Data.Singletons.Prelude.Maybe

type Apply (IsJustSym0 :: TyFun (Maybe a) Bool -> Type) (a6989586621679913598 :: Maybe a) = IsJust a6989586621679913598
type Apply (AndSym0 :: TyFun (t Bool) Bool -> Type) (a6989586621680742863 :: t Bool) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (AndSym0 :: TyFun (t Bool) Bool -> Type) (a6989586621680742863 :: t Bool) = And a6989586621680742863
type Apply (Let6989586621680742866Scrutinee_6989586621680742628Sym0 :: TyFun (t6989586621680742381 Bool) All -> Type) (x6989586621680742865 :: t6989586621680742381 Bool) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Let6989586621680742866Scrutinee_6989586621680742628Sym0 :: TyFun (t6989586621680742381 Bool) All -> Type) (x6989586621680742865 :: t6989586621680742381 Bool) = Let6989586621680742866Scrutinee_6989586621680742628 x6989586621680742865
type Apply (OrSym0 :: TyFun (t Bool) Bool -> Type) (a6989586621680742854 :: t Bool) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (OrSym0 :: TyFun (t Bool) Bool -> Type) (a6989586621680742854 :: t Bool) = Or a6989586621680742854
type Apply (Let6989586621680742857Scrutinee_6989586621680742630Sym0 :: TyFun (t6989586621680742381 Bool) Any -> Type) (x6989586621680742856 :: t6989586621680742381 Bool) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Let6989586621680742857Scrutinee_6989586621680742630Sym0 :: TyFun (t6989586621680742381 Bool) Any -> Type) (x6989586621680742856 :: t6989586621680742381 Bool) = Let6989586621680742857Scrutinee_6989586621680742630 x6989586621680742856
type Apply (Null_6989586621680921344Sym0 :: TyFun (Identity a) Bool -> Type) (a6989586621680921343 :: Identity a) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type Apply (Null_6989586621680921344Sym0 :: TyFun (Identity a) Bool -> Type) (a6989586621680921343 :: Identity a) = Null_6989586621680921344 a6989586621680921343
type Apply (ListelemSym1 a6989586621680687700 :: TyFun [a] Bool -> Type) (a6989586621680687701 :: [a]) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

type Apply (ListelemSym1 a6989586621680687700 :: TyFun [a] Bool -> Type) (a6989586621680687701 :: [a]) = Listelem a6989586621680687700 a6989586621680687701
type Apply (ListisPrefixOfSym1 a6989586621680687765 :: TyFun [a] Bool -> Type) (a6989586621680687766 :: [a]) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

type Apply (ListisPrefixOfSym1 a6989586621680687765 :: TyFun [a] Bool -> Type) (a6989586621680687766 :: [a]) = ListisPrefixOf a6989586621680687765 a6989586621680687766
type Apply (NotElemSym1 a6989586621680321269 :: TyFun [a] Bool -> Type) (a6989586621680321270 :: [a]) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (NotElemSym1 a6989586621680321269 :: TyFun [a] Bool -> Type) (a6989586621680321270 :: [a]) = NotElem a6989586621680321269 a6989586621680321270
type Apply (ElemSym1 a6989586621680321276 :: TyFun [a] Bool -> Type) (a6989586621680321277 :: [a]) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (ElemSym1 a6989586621680321276 :: TyFun [a] Bool -> Type) (a6989586621680321277 :: [a]) = Elem a6989586621680321276 a6989586621680321277
type Apply (IsPrefixOfSym1 a6989586621680321295 :: TyFun [a] Bool -> Type) (a6989586621680321296 :: [a]) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (IsPrefixOfSym1 a6989586621680321295 :: TyFun [a] Bool -> Type) (a6989586621680321296 :: [a]) = IsPrefixOf a6989586621680321295 a6989586621680321296
type Apply (AnySym1 a6989586621680321526 :: TyFun [a] Bool -> Type) (a6989586621680321527 :: [a]) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (AnySym1 a6989586621680321526 :: TyFun [a] Bool -> Type) (a6989586621680321527 :: [a]) = Any a6989586621680321526 a6989586621680321527
type Apply (IsInfixOfSym1 a6989586621680321283 :: TyFun [a] Bool -> Type) (a6989586621680321284 :: [a]) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (IsInfixOfSym1 a6989586621680321283 :: TyFun [a] Bool -> Type) (a6989586621680321284 :: [a]) = IsInfixOf a6989586621680321283 a6989586621680321284
type Apply (AllSym1 a6989586621680321533 :: TyFun [a] Bool -> Type) (a6989586621680321534 :: [a]) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (AllSym1 a6989586621680321533 :: TyFun [a] Bool -> Type) (a6989586621680321534 :: [a]) = All a6989586621680321533 a6989586621680321534
type Apply (IsSuffixOfSym1 a6989586621680321289 :: TyFun [a] Bool -> Type) (a6989586621680321290 :: [a]) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (IsSuffixOfSym1 a6989586621680321289 :: TyFun [a] Bool -> Type) (a6989586621680321290 :: [a]) = IsSuffixOf a6989586621680321289 a6989586621680321290
type Apply (Elem_6989586621680921217Sym1 a6989586621680921215 :: TyFun (Identity a) Bool -> Type) (a6989586621680921216 :: Identity a) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type Apply (Elem_6989586621680921217Sym1 a6989586621680921215 :: TyFun (Identity a) Bool -> Type) (a6989586621680921216 :: Identity a) = Elem_6989586621680921217 a6989586621680921215 a6989586621680921216
type Apply (Elem_bySym2 a6989586621680320413 a6989586621680320412 :: TyFun [a] Bool -> Type) (a6989586621680320414 :: [a]) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (Elem_bySym2 a6989586621680320413 a6989586621680320412 :: TyFun [a] Bool -> Type) (a6989586621680320414 :: [a]) = Elem_by a6989586621680320413 a6989586621680320412 a6989586621680320414
type Apply (Elem_6989586621680743293Sym1 a6989586621680743291 t :: TyFun (t a) Bool -> Type) (a6989586621680743292 :: t a) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Elem_6989586621680743293Sym1 a6989586621680743291 t :: TyFun (t a) Bool -> Type) (a6989586621680743292 :: t a) = Elem_6989586621680743293 a6989586621680743291 a6989586621680743292
type Apply (Null_6989586621680743249Sym0 :: TyFun (t a) Bool -> Type) (a6989586621680743248 :: t a) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Null_6989586621680743249Sym0 :: TyFun (t a) Bool -> Type) (a6989586621680743248 :: t a) = Null_6989586621680743249 a6989586621680743248
type Apply (AnySym1 a6989586621680742841 t :: TyFun (t a) Bool -> Type) (a6989586621680742842 :: t a) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (AnySym1 a6989586621680742841 t :: TyFun (t a) Bool -> Type) (a6989586621680742842 :: t a) = Any a6989586621680742841 a6989586621680742842
type Apply (ElemSym1 arg6989586621680743044 t :: TyFun (t a) Bool -> Type) (arg6989586621680743045 :: t a) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (ElemSym1 arg6989586621680743044 t :: TyFun (t a) Bool -> Type) (arg6989586621680743045 :: t a) = Elem arg6989586621680743044 arg6989586621680743045
type Apply (NotElemSym1 a6989586621680742770 t :: TyFun (t a) Bool -> Type) (a6989586621680742771 :: t a) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (NotElemSym1 a6989586621680742770 t :: TyFun (t a) Bool -> Type) (a6989586621680742771 :: t a) = NotElem a6989586621680742770 a6989586621680742771
type Apply (NullSym0 :: TyFun (t a) Bool -> Type) (arg6989586621680743040 :: t a) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (NullSym0 :: TyFun (t a) Bool -> Type) (arg6989586621680743040 :: t a) = Null arg6989586621680743040
type Apply (AllSym1 a6989586621680742828 t :: TyFun (t a) Bool -> Type) (a6989586621680742829 :: t a) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (AllSym1 a6989586621680742828 t :: TyFun (t a) Bool -> Type) (a6989586621680742829 :: t a) = All a6989586621680742828 a6989586621680742829
type Apply (Elem_6989586621680743413Sym1 a6989586621680743411 t :: TyFun (t a) Bool -> Type) (a6989586621680743412 :: t a) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Elem_6989586621680743413Sym1 a6989586621680743411 t :: TyFun (t a) Bool -> Type) (a6989586621680743412 :: t a) = Elem_6989586621680743413 a6989586621680743411 a6989586621680743412
type Apply (Null_6989586621680743556Sym0 :: TyFun (t a) Bool -> Type) (a6989586621680743555 :: t a) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Null_6989586621680743556Sym0 :: TyFun (t a) Bool -> Type) (a6989586621680743555 :: t a) = Null_6989586621680743556 a6989586621680743555
type Apply (Null_6989586621680743732Sym0 :: TyFun (t a) Bool -> Type) (a6989586621680743731 :: t a) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Null_6989586621680743732Sym0 :: TyFun (t a) Bool -> Type) (a6989586621680743731 :: t a) = Null_6989586621680743732 a6989586621680743731
type Apply (Elem_6989586621680743754Sym1 a6989586621680743752 t :: TyFun (t a) Bool -> Type) (a6989586621680743753 :: t a) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Elem_6989586621680743754Sym1 a6989586621680743752 t :: TyFun (t a) Bool -> Type) (a6989586621680743753 :: t a) = Elem_6989586621680743754 a6989586621680743752 a6989586621680743753
type Apply (Null_6989586621680743881Sym0 :: TyFun (t a) Bool -> Type) (a6989586621680743880 :: t a) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Null_6989586621680743881Sym0 :: TyFun (t a) Bool -> Type) (a6989586621680743880 :: t a) = Null_6989586621680743881 a6989586621680743880
type Apply (Elem_6989586621680743921Sym1 a6989586621680743919 t :: TyFun (t a) Bool -> Type) (a6989586621680743920 :: t a) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Elem_6989586621680743921Sym1 a6989586621680743919 t :: TyFun (t a) Bool -> Type) (a6989586621680743920 :: t a) = Elem_6989586621680743921 a6989586621680743919 a6989586621680743920
type Apply (Null_6989586621680744048Sym0 :: TyFun (t a) Bool -> Type) (a6989586621680744047 :: t a) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Null_6989586621680744048Sym0 :: TyFun (t a) Bool -> Type) (a6989586621680744047 :: t a) = Null_6989586621680744048 a6989586621680744047
type Apply (Elem_6989586621680744088Sym1 a6989586621680744086 t :: TyFun (t a) Bool -> Type) (a6989586621680744087 :: t a) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Elem_6989586621680744088Sym1 a6989586621680744086 t :: TyFun (t a) Bool -> Type) (a6989586621680744087 :: t a) = Elem_6989586621680744088 a6989586621680744086 a6989586621680744087
type Apply (Null_6989586621680744215Sym0 :: TyFun (t a) Bool -> Type) (a6989586621680744214 :: t a) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Null_6989586621680744215Sym0 :: TyFun (t a) Bool -> Type) (a6989586621680744214 :: t a) = Null_6989586621680744215 a6989586621680744214
type Apply (ListisPrefixOfSym0 :: TyFun [a6989586621680686805] ([a6989586621680686805] ~> Bool) -> Type) (a6989586621680687765 :: [a6989586621680686805]) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

type Apply (ListisPrefixOfSym0 :: TyFun [a6989586621680686805] ([a6989586621680686805] ~> Bool) -> Type) (a6989586621680687765 :: [a6989586621680686805]) = ListisPrefixOfSym1 a6989586621680687765
type Apply (IsPrefixOfSym0 :: TyFun [a6989586621680316403] ([a6989586621680316403] ~> Bool) -> Type) (a6989586621680321295 :: [a6989586621680316403]) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (IsPrefixOfSym0 :: TyFun [a6989586621680316403] ([a6989586621680316403] ~> Bool) -> Type) (a6989586621680321295 :: [a6989586621680316403]) = IsPrefixOfSym1 a6989586621680321295
type Apply (IsInfixOfSym0 :: TyFun [a6989586621680316401] ([a6989586621680316401] ~> Bool) -> Type) (a6989586621680321283 :: [a6989586621680316401]) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (IsInfixOfSym0 :: TyFun [a6989586621680316401] ([a6989586621680316401] ~> Bool) -> Type) (a6989586621680321283 :: [a6989586621680316401]) = IsInfixOfSym1 a6989586621680321283
type Apply (IsSuffixOfSym0 :: TyFun [a6989586621680316402] ([a6989586621680316402] ~> Bool) -> Type) (a6989586621680321289 :: [a6989586621680316402]) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (IsSuffixOfSym0 :: TyFun [a6989586621680316402] ([a6989586621680316402] ~> Bool) -> Type) (a6989586621680321289 :: [a6989586621680316402]) = IsSuffixOfSym1 a6989586621680321289
type Apply (Let6989586621680320760Scrutinee_6989586621680316995Sym1 x6989586621680320758 :: TyFun [a6989586621680316437] (TyFun (k1 ~> Bool) (TyFun k Bool -> Type) -> Type) -> Type) (xs6989586621680320759 :: [a6989586621680316437]) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (Let6989586621680320760Scrutinee_6989586621680316995Sym1 x6989586621680320758 :: TyFun [a6989586621680316437] (TyFun (k1 ~> Bool) (TyFun k Bool -> Type) -> Type) -> Type) (xs6989586621680320759 :: [a6989586621680316437]) = Let6989586621680320760Scrutinee_6989586621680316995Sym2 x6989586621680320758 xs6989586621680320759 :: TyFun (k1 ~> Bool) (TyFun k Bool -> Type) -> Type
type Apply (Let6989586621680320438Scrutinee_6989586621680317023Sym2 ys6989586621680320436 y6989586621680320435 :: TyFun [k1] (TyFun (k1 ~> (k1 ~> Bool)) (TyFun k3 Bool -> Type) -> Type) -> Type) (xs6989586621680320437 :: [k1]) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (Let6989586621680320438Scrutinee_6989586621680317023Sym2 ys6989586621680320436 y6989586621680320435 :: TyFun [k1] (TyFun (k1 ~> (k1 ~> Bool)) (TyFun k3 Bool -> Type) -> Type) -> Type) (xs6989586621680320437 :: [k1]) = Let6989586621680320438Scrutinee_6989586621680317023Sym3 ys6989586621680320436 y6989586621680320435 xs6989586621680320437 :: TyFun (k1 ~> (k1 ~> Bool)) (TyFun k3 Bool -> Type) -> Type
type Apply (Let6989586621680320459Scrutinee_6989586621680317021Sym2 xs6989586621680320457 x6989586621680320456 :: TyFun [k1] (TyFun k3 Bool -> Type) -> Type) (ls6989586621680320458 :: [k1]) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (Let6989586621680320459Scrutinee_6989586621680317021Sym2 xs6989586621680320457 x6989586621680320456 :: TyFun [k1] (TyFun k3 Bool -> Type) -> Type) (ls6989586621680320458 :: [k1]) = Let6989586621680320459Scrutinee_6989586621680317021Sym3 xs6989586621680320457 x6989586621680320456 ls6989586621680320458 :: TyFun k3 Bool -> Type
type Apply (IsRightSym0 :: TyFun (Either a b) Bool -> Type) (a6989586621680725481 :: Either a b) 
Instance details

Defined in Data.Singletons.Prelude.Either

type Apply (IsRightSym0 :: TyFun (Either a b) Bool -> Type) (a6989586621680725481 :: Either a b) = IsRight a6989586621680725481
type Apply (IsLeftSym0 :: TyFun (Either a b) Bool -> Type) (a6989586621680725483 :: Either a b) 
Instance details

Defined in Data.Singletons.Prelude.Either

type Apply (IsLeftSym0 :: TyFun (Either a b) Bool -> Type) (a6989586621680725483 :: Either a b) = IsLeft a6989586621680725483
type Apply (TFHelper_6989586621681108278Sym1 a6989586621681108276 :: TyFun (Arg a b) Bool -> Type) (a6989586621681108277 :: Arg a b) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (TFHelper_6989586621681108278Sym1 a6989586621681108276 :: TyFun (Arg a b) Bool -> Type) (a6989586621681108277 :: Arg a b) = TFHelper_6989586621681108278 a6989586621681108276 a6989586621681108277
type Apply (ListnubBySym0 :: TyFun (a6989586621680686799 ~> (a6989586621680686799 ~> Bool)) ([a6989586621680686799] ~> [a6989586621680686799]) -> Type) (a6989586621680687730 :: a6989586621680686799 ~> (a6989586621680686799 ~> Bool)) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

type Apply (ListnubBySym0 :: TyFun (a6989586621680686799 ~> (a6989586621680686799 ~> Bool)) ([a6989586621680686799] ~> [a6989586621680686799]) -> Type) (a6989586621680687730 :: a6989586621680686799 ~> (a6989586621680686799 ~> Bool)) = ListnubBySym1 a6989586621680687730
type Apply (ListpartitionSym0 :: TyFun (a6989586621680686807 ~> Bool) ([a6989586621680686807] ~> ([a6989586621680686807], [a6989586621680686807])) -> Type) (a6989586621680687785 :: a6989586621680686807 ~> Bool) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

type Apply (ListpartitionSym0 :: TyFun (a6989586621680686807 ~> Bool) ([a6989586621680686807] ~> ([a6989586621680686807], [a6989586621680686807])) -> Type) (a6989586621680687785 :: a6989586621680686807 ~> Bool) = ListpartitionSym1 a6989586621680687785
type Apply (ListfilterSym0 :: TyFun (a6989586621680686808 ~> Bool) ([a6989586621680686808] ~> [a6989586621680686808]) -> Type) (a6989586621680687795 :: a6989586621680686808 ~> Bool) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

type Apply (ListfilterSym0 :: TyFun (a6989586621680686808 ~> Bool) ([a6989586621680686808] ~> [a6989586621680686808]) -> Type) (a6989586621680687795 :: a6989586621680686808 ~> Bool) = ListfilterSym1 a6989586621680687795
type Apply (ListspanSym0 :: TyFun (a6989586621680686809 ~> Bool) ([a6989586621680686809] ~> ([a6989586621680686809], [a6989586621680686809])) -> Type) (a6989586621680687805 :: a6989586621680686809 ~> Bool) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

type Apply (ListspanSym0 :: TyFun (a6989586621680686809 ~> Bool) ([a6989586621680686809] ~> ([a6989586621680686809], [a6989586621680686809])) -> Type) (a6989586621680687805 :: a6989586621680686809 ~> Bool) = ListspanSym1 a6989586621680687805
type Apply (ListdropWhileSym0 :: TyFun (a6989586621680686810 ~> Bool) ([a6989586621680686810] ~> [a6989586621680686810]) -> Type) (a6989586621680687815 :: a6989586621680686810 ~> Bool) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

type Apply (ListdropWhileSym0 :: TyFun (a6989586621680686810 ~> Bool) ([a6989586621680686810] ~> [a6989586621680686810]) -> Type) (a6989586621680687815 :: a6989586621680686810 ~> Bool) = ListdropWhileSym1 a6989586621680687815
type Apply (ListtakeWhileSym0 :: TyFun (a6989586621680686811 ~> Bool) ([a6989586621680686811] ~> [a6989586621680686811]) -> Type) (a6989586621680687825 :: a6989586621680686811 ~> Bool) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

type Apply (ListtakeWhileSym0 :: TyFun (a6989586621680686811 ~> Bool) ([a6989586621680686811] ~> [a6989586621680686811]) -> Type) (a6989586621680687825 :: a6989586621680686811 ~> Bool) = ListtakeWhileSym1 a6989586621680687825
type Apply (Elem_bySym0 :: TyFun (a6989586621680316317 ~> (a6989586621680316317 ~> Bool)) (a6989586621680316317 ~> ([a6989586621680316317] ~> Bool)) -> Type) (a6989586621680320412 :: a6989586621680316317 ~> (a6989586621680316317 ~> Bool)) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (Elem_bySym0 :: TyFun (a6989586621680316317 ~> (a6989586621680316317 ~> Bool)) (a6989586621680316317 ~> ([a6989586621680316317] ~> Bool)) -> Type) (a6989586621680320412 :: a6989586621680316317 ~> (a6989586621680316317 ~> Bool)) = Elem_bySym1 a6989586621680320412
type Apply (NubBySym0 :: TyFun (a6989586621680316318 ~> (a6989586621680316318 ~> Bool)) ([a6989586621680316318] ~> [a6989586621680316318]) -> Type) (a6989586621680320422 :: a6989586621680316318 ~> (a6989586621680316318 ~> Bool)) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (NubBySym0 :: TyFun (a6989586621680316318 ~> (a6989586621680316318 ~> Bool)) ([a6989586621680316318] ~> [a6989586621680316318]) -> Type) (a6989586621680320422 :: a6989586621680316318 ~> (a6989586621680316318 ~> Bool)) = NubBySym1 a6989586621680320422
type Apply (SelectSym0 :: TyFun (a6989586621680316326 ~> Bool) (a6989586621680316326 ~> (([a6989586621680316326], [a6989586621680316326]) ~> ([a6989586621680316326], [a6989586621680316326]))) -> Type) (a6989586621680320528 :: a6989586621680316326 ~> Bool) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (SelectSym0 :: TyFun (a6989586621680316326 ~> Bool) (a6989586621680316326 ~> (([a6989586621680316326], [a6989586621680316326]) ~> ([a6989586621680316326], [a6989586621680316326]))) -> Type) (a6989586621680320528 :: a6989586621680316326 ~> Bool) = SelectSym1 a6989586621680320528
type Apply (PartitionSym0 :: TyFun (a6989586621680316327 ~> Bool) ([a6989586621680316327] ~> ([a6989586621680316327], [a6989586621680316327])) -> Type) (a6989586621680320546 :: a6989586621680316327 ~> Bool) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (PartitionSym0 :: TyFun (a6989586621680316327 ~> Bool) ([a6989586621680316327] ~> ([a6989586621680316327], [a6989586621680316327])) -> Type) (a6989586621680320546 :: a6989586621680316327 ~> Bool) = PartitionSym1 a6989586621680320546
type Apply (BreakSym0 :: TyFun (a6989586621680316339 ~> Bool) ([a6989586621680316339] ~> ([a6989586621680316339], [a6989586621680316339])) -> Type) (a6989586621680320662 :: a6989586621680316339 ~> Bool) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (BreakSym0 :: TyFun (a6989586621680316339 ~> Bool) ([a6989586621680316339] ~> ([a6989586621680316339], [a6989586621680316339])) -> Type) (a6989586621680320662 :: a6989586621680316339 ~> Bool) = BreakSym1 a6989586621680320662
type Apply (Let6989586621680320680YsSym0 :: TyFun (k ~> Bool) (TyFun k (TyFun [k] [k] -> Type) -> Type) -> Type) (p6989586621680320667 :: k ~> Bool) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (Let6989586621680320680YsSym0 :: TyFun (k ~> Bool) (TyFun k (TyFun [k] [k] -> Type) -> Type) -> Type) (p6989586621680320667 :: k ~> Bool) = Let6989586621680320680YsSym1 p6989586621680320667
type Apply (Let6989586621680320680ZsSym0 :: TyFun (k ~> Bool) (TyFun k (TyFun [k] [k] -> Type) -> Type) -> Type) (p6989586621680320667 :: k ~> Bool) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (Let6989586621680320680ZsSym0 :: TyFun (k ~> Bool) (TyFun k (TyFun [k] [k] -> Type) -> Type) -> Type) (p6989586621680320667 :: k ~> Bool) = Let6989586621680320680ZsSym1 p6989586621680320667
type Apply (Let6989586621680320680X_6989586621680320681Sym0 :: TyFun (k ~> Bool) (TyFun k (TyFun [k] ([k], [k]) -> Type) -> Type) -> Type) (p6989586621680320667 :: k ~> Bool) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (Let6989586621680320680X_6989586621680320681Sym0 :: TyFun (k ~> Bool) (TyFun k (TyFun [k] ([k], [k]) -> Type) -> Type) -> Type) (p6989586621680320667 :: k ~> Bool) = Let6989586621680320680X_6989586621680320681Sym1 p6989586621680320667
type Apply (SpanSym0 :: TyFun (a6989586621680316340 ~> Bool) ([a6989586621680316340] ~> ([a6989586621680316340], [a6989586621680316340])) -> Type) (a6989586621680320705 :: a6989586621680316340 ~> Bool) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (SpanSym0 :: TyFun (a6989586621680316340 ~> Bool) ([a6989586621680316340] ~> ([a6989586621680316340], [a6989586621680316340])) -> Type) (a6989586621680320705 :: a6989586621680316340 ~> Bool) = SpanSym1 a6989586621680320705
type Apply (Let6989586621680320723YsSym0 :: TyFun (k ~> Bool) (TyFun k (TyFun [k] [k] -> Type) -> Type) -> Type) (p6989586621680320710 :: k ~> Bool) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (Let6989586621680320723YsSym0 :: TyFun (k ~> Bool) (TyFun k (TyFun [k] [k] -> Type) -> Type) -> Type) (p6989586621680320710 :: k ~> Bool) = Let6989586621680320723YsSym1 p6989586621680320710
type Apply (Let6989586621680320723ZsSym0 :: TyFun (k ~> Bool) (TyFun k (TyFun [k] [k] -> Type) -> Type) -> Type) (p6989586621680320710 :: k ~> Bool) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (Let6989586621680320723ZsSym0 :: TyFun (k ~> Bool) (TyFun k (TyFun [k] [k] -> Type) -> Type) -> Type) (p6989586621680320710 :: k ~> Bool) = Let6989586621680320723ZsSym1 p6989586621680320710
type Apply (Let6989586621680320723X_6989586621680320724Sym0 :: TyFun (k ~> Bool) (TyFun k (TyFun [k] ([k], [k]) -> Type) -> Type) -> Type) (p6989586621680320710 :: k ~> Bool) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (Let6989586621680320723X_6989586621680320724Sym0 :: TyFun (k ~> Bool) (TyFun k (TyFun [k] ([k], [k]) -> Type) -> Type) -> Type) (p6989586621680320710 :: k ~> Bool) = Let6989586621680320723X_6989586621680320724Sym1 p6989586621680320710
type Apply (GroupBySym0 :: TyFun (a6989586621680316330 ~> (a6989586621680316330 ~> Bool)) ([a6989586621680316330] ~> [[a6989586621680316330]]) -> Type) (a6989586621680320569 :: a6989586621680316330 ~> (a6989586621680316330 ~> Bool)) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (GroupBySym0 :: TyFun (a6989586621680316330 ~> (a6989586621680316330 ~> Bool)) ([a6989586621680316330] ~> [[a6989586621680316330]]) -> Type) (a6989586621680320569 :: a6989586621680316330 ~> (a6989586621680316330 ~> Bool)) = GroupBySym1 a6989586621680320569
type Apply (DropWhileSym0 :: TyFun (a6989586621680316342 ~> Bool) ([a6989586621680316342] ~> [a6989586621680316342]) -> Type) (a6989586621680320774 :: a6989586621680316342 ~> Bool) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (DropWhileSym0 :: TyFun (a6989586621680316342 ~> Bool) ([a6989586621680316342] ~> [a6989586621680316342]) -> Type) (a6989586621680320774 :: a6989586621680316342 ~> Bool) = DropWhileSym1 a6989586621680320774
type Apply (TakeWhileSym0 :: TyFun (a6989586621680316343 ~> Bool) ([a6989586621680316343] ~> [a6989586621680316343]) -> Type) (a6989586621680320792 :: a6989586621680316343 ~> Bool) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (TakeWhileSym0 :: TyFun (a6989586621680316343 ~> Bool) ([a6989586621680316343] ~> [a6989586621680316343]) -> Type) (a6989586621680320792 :: a6989586621680316343 ~> Bool) = TakeWhileSym1 a6989586621680320792
type Apply (FilterSym0 :: TyFun (a6989586621680316351 ~> Bool) ([a6989586621680316351] ~> [a6989586621680316351]) -> Type) (a6989586621680320906 :: a6989586621680316351 ~> Bool) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (FilterSym0 :: TyFun (a6989586621680316351 ~> Bool) ([a6989586621680316351] ~> [a6989586621680316351]) -> Type) (a6989586621680320906 :: a6989586621680316351 ~> Bool) = FilterSym1 a6989586621680320906
type Apply (FindSym0 :: TyFun (a6989586621680316350 ~> Bool) ([a6989586621680316350] ~> Maybe a6989586621680316350) -> Type) (a6989586621680320898 :: a6989586621680316350 ~> Bool) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (FindSym0 :: TyFun (a6989586621680316350 ~> Bool) ([a6989586621680316350] ~> Maybe a6989586621680316350) -> Type) (a6989586621680320898 :: a6989586621680316350 ~> Bool) = FindSym1 a6989586621680320898
type Apply (DeleteBySym0 :: TyFun (a6989586621680316357 ~> (a6989586621680316357 ~> Bool)) (a6989586621680316357 ~> ([a6989586621680316357] ~> [a6989586621680316357])) -> Type) (a6989586621680321026 :: a6989586621680316357 ~> (a6989586621680316357 ~> Bool)) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (DeleteBySym0 :: TyFun (a6989586621680316357 ~> (a6989586621680316357 ~> Bool)) (a6989586621680316357 ~> ([a6989586621680316357] ~> [a6989586621680316357])) -> Type) (a6989586621680321026 :: a6989586621680316357 ~> (a6989586621680316357 ~> Bool)) = DeleteBySym1 a6989586621680321026
type Apply (DeleteFirstsBySym0 :: TyFun (a6989586621680316356 ~> (a6989586621680316356 ~> Bool)) ([a6989586621680316356] ~> ([a6989586621680316356] ~> [a6989586621680316356])) -> Type) (a6989586621680321013 :: a6989586621680316356 ~> (a6989586621680316356 ~> Bool)) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (DeleteFirstsBySym0 :: TyFun (a6989586621680316356 ~> (a6989586621680316356 ~> Bool)) ([a6989586621680316356] ~> ([a6989586621680316356] ~> [a6989586621680316356])) -> Type) (a6989586621680321013 :: a6989586621680316356 ~> (a6989586621680316356 ~> Bool)) = DeleteFirstsBySym1 a6989586621680321013
type Apply (UnionBySym0 :: TyFun (a6989586621680316316 ~> (a6989586621680316316 ~> Bool)) ([a6989586621680316316] ~> ([a6989586621680316316] ~> [a6989586621680316316])) -> Type) (a6989586621680320403 :: a6989586621680316316 ~> (a6989586621680316316 ~> Bool)) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (UnionBySym0 :: TyFun (a6989586621680316316 ~> (a6989586621680316316 ~> Bool)) ([a6989586621680316316] ~> ([a6989586621680316316] ~> [a6989586621680316316])) -> Type) (a6989586621680320403 :: a6989586621680316316 ~> (a6989586621680316316 ~> Bool)) = UnionBySym1 a6989586621680320403
type Apply (FindIndicesSym0 :: TyFun (a6989586621680316346 ~> Bool) ([a6989586621680316346] ~> [Nat]) -> Type) (a6989586621680320848 :: a6989586621680316346 ~> Bool) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (FindIndicesSym0 :: TyFun (a6989586621680316346 ~> Bool) ([a6989586621680316346] ~> [Nat]) -> Type) (a6989586621680320848 :: a6989586621680316346 ~> Bool) = FindIndicesSym1 a6989586621680320848
type Apply (FindIndexSym0 :: TyFun (a6989586621680316347 ~> Bool) ([a6989586621680316347] ~> Maybe Nat) -> Type) (a6989586621680320874 :: a6989586621680316347 ~> Bool) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (FindIndexSym0 :: TyFun (a6989586621680316347 ~> Bool) ([a6989586621680316347] ~> Maybe Nat) -> Type) (a6989586621680320874 :: a6989586621680316347 ~> Bool) = FindIndexSym1 a6989586621680320874
type Apply (AnySym0 :: TyFun (a6989586621680316420 ~> Bool) ([a6989586621680316420] ~> Bool) -> Type) (a6989586621680321526 :: a6989586621680316420 ~> Bool) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (AnySym0 :: TyFun (a6989586621680316420 ~> Bool) ([a6989586621680316420] ~> Bool) -> Type) (a6989586621680321526 :: a6989586621680316420 ~> Bool) = AnySym1 a6989586621680321526
type Apply (IntersectBySym0 :: TyFun (a6989586621680316344 ~> (a6989586621680316344 ~> Bool)) ([a6989586621680316344] ~> ([a6989586621680316344] ~> [a6989586621680316344])) -> Type) (a6989586621680320806 :: a6989586621680316344 ~> (a6989586621680316344 ~> Bool)) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (IntersectBySym0 :: TyFun (a6989586621680316344 ~> (a6989586621680316344 ~> Bool)) ([a6989586621680316344] ~> ([a6989586621680316344] ~> [a6989586621680316344])) -> Type) (a6989586621680320806 :: a6989586621680316344 ~> (a6989586621680316344 ~> Bool)) = IntersectBySym1 a6989586621680320806
type Apply (AllSym0 :: TyFun (a6989586621680316421 ~> Bool) ([a6989586621680316421] ~> Bool) -> Type) (a6989586621680321533 :: a6989586621680316421 ~> Bool) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (AllSym0 :: TyFun (a6989586621680316421 ~> Bool) ([a6989586621680316421] ~> Bool) -> Type) (a6989586621680321533 :: a6989586621680316421 ~> Bool) = AllSym1 a6989586621680321533
type Apply (DropWhileEndSym0 :: TyFun (a6989586621680316341 ~> Bool) ([a6989586621680316341] ~> [a6989586621680316341]) -> Type) (a6989586621680320748 :: a6989586621680316341 ~> Bool) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (DropWhileEndSym0 :: TyFun (a6989586621680316341 ~> Bool) ([a6989586621680316341] ~> [a6989586621680316341]) -> Type) (a6989586621680320748 :: a6989586621680316341 ~> Bool) = DropWhileEndSym1 a6989586621680320748
type Apply (UntilSym0 :: TyFun (a6989586621679941593 ~> Bool) ((a6989586621679941593 ~> a6989586621679941593) ~> (a6989586621679941593 ~> a6989586621679941593)) -> Type) (a6989586621679941718 :: a6989586621679941593 ~> Bool) 
Instance details

Defined in Data.Singletons.Prelude.Base

type Apply (UntilSym0 :: TyFun (a6989586621679941593 ~> Bool) ((a6989586621679941593 ~> a6989586621679941593) ~> (a6989586621679941593 ~> a6989586621679941593)) -> Type) (a6989586621679941718 :: a6989586621679941593 ~> Bool) = UntilSym1 a6989586621679941718
type Apply (TFHelper_6989586621681108278Sym0 :: TyFun (Arg a6989586621681107123 b6989586621681107124) (Arg a6989586621681107123 b6989586621681107124 ~> Bool) -> Type) (a6989586621681108276 :: Arg a6989586621681107123 b6989586621681107124) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (TFHelper_6989586621681108278Sym0 :: TyFun (Arg a6989586621681107123 b6989586621681107124) (Arg a6989586621681107123 b6989586621681107124 ~> Bool) -> Type) (a6989586621681108276 :: Arg a6989586621681107123 b6989586621681107124) = TFHelper_6989586621681108278Sym1 a6989586621681108276
type Apply (Let6989586621680320428NubBy'Sym0 :: TyFun (k1 ~> (k1 ~> Bool)) (TyFun k (TyFun [k1] ([k1] ~> [k1]) -> Type) -> Type) -> Type) (eq6989586621680320426 :: k1 ~> (k1 ~> Bool)) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (Let6989586621680320428NubBy'Sym0 :: TyFun (k1 ~> (k1 ~> Bool)) (TyFun k (TyFun [k1] ([k1] ~> [k1]) -> Type) -> Type) -> Type) (eq6989586621680320426 :: k1 ~> (k1 ~> Bool)) = Let6989586621680320428NubBy'Sym1 eq6989586621680320426 :: TyFun k (TyFun [k1] ([k1] ~> [k1]) -> Type) -> Type
type Apply (Let6989586621680320576YsSym0 :: TyFun (k1 ~> (a6989586621680316340 ~> Bool)) (TyFun k1 (TyFun [a6989586621680316340] [a6989586621680316340] -> Type) -> Type) -> Type) (eq6989586621680320573 :: k1 ~> (a6989586621680316340 ~> Bool)) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (Let6989586621680320576YsSym0 :: TyFun (k1 ~> (a6989586621680316340 ~> Bool)) (TyFun k1 (TyFun [a6989586621680316340] [a6989586621680316340] -> Type) -> Type) -> Type) (eq6989586621680320573 :: k1 ~> (a6989586621680316340 ~> Bool)) = Let6989586621680320576YsSym1 eq6989586621680320573
type Apply (Let6989586621680320576ZsSym0 :: TyFun (k1 ~> (a6989586621680316340 ~> Bool)) (TyFun k1 (TyFun [a6989586621680316340] [a6989586621680316340] -> Type) -> Type) -> Type) (eq6989586621680320573 :: k1 ~> (a6989586621680316340 ~> Bool)) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (Let6989586621680320576ZsSym0 :: TyFun (k1 ~> (a6989586621680316340 ~> Bool)) (TyFun k1 (TyFun [a6989586621680316340] [a6989586621680316340] -> Type) -> Type) -> Type) (eq6989586621680320573 :: k1 ~> (a6989586621680316340 ~> Bool)) = Let6989586621680320576ZsSym1 eq6989586621680320573
type Apply (Let6989586621680320576X_6989586621680320577Sym0 :: TyFun (k1 ~> (a6989586621680316340 ~> Bool)) (TyFun k1 (TyFun [a6989586621680316340] ([a6989586621680316340], [a6989586621680316340]) -> Type) -> Type) -> Type) (eq6989586621680320573 :: k1 ~> (a6989586621680316340 ~> Bool)) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (Let6989586621680320576X_6989586621680320577Sym0 :: TyFun (k1 ~> (a6989586621680316340 ~> Bool)) (TyFun k1 (TyFun [a6989586621680316340] ([a6989586621680316340], [a6989586621680316340]) -> Type) -> Type) -> Type) (eq6989586621680320573 :: k1 ~> (a6989586621680316340 ~> Bool)) = Let6989586621680320576X_6989586621680320577Sym1 eq6989586621680320573
type Apply (Lambda_6989586621680320756Sym0 :: TyFun (a6989586621680316437 ~> Bool) (TyFun k (TyFun a6989586621680316437 (TyFun [a6989586621680316437] [a6989586621680316437] -> Type) -> Type) -> Type) -> Type) (p6989586621680320754 :: a6989586621680316437 ~> Bool) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (Lambda_6989586621680320756Sym0 :: TyFun (a6989586621680316437 ~> Bool) (TyFun k (TyFun a6989586621680316437 (TyFun [a6989586621680316437] [a6989586621680316437] -> Type) -> Type) -> Type) -> Type) (p6989586621680320754 :: a6989586621680316437 ~> Bool) = Lambda_6989586621680320756Sym1 p6989586621680320754 :: TyFun k (TyFun a6989586621680316437 (TyFun [a6989586621680316437] [a6989586621680316437] -> Type) -> Type) -> Type
type Apply (Lambda_6989586621680742750Sym0 :: TyFun (a6989586621679087424 ~> Bool) (TyFun k (TyFun a6989586621679087424 (First a6989586621679087424) -> Type) -> Type) -> Type) (p6989586621680742747 :: a6989586621679087424 ~> Bool) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Lambda_6989586621680742750Sym0 :: TyFun (a6989586621679087424 ~> Bool) (TyFun k (TyFun a6989586621679087424 (First a6989586621679087424) -> Type) -> Type) -> Type) (p6989586621680742747 :: a6989586621679087424 ~> Bool) = Lambda_6989586621680742750Sym1 p6989586621680742747 :: TyFun k (TyFun a6989586621679087424 (First a6989586621679087424) -> Type) -> Type
type Apply (AnySym0 :: TyFun (a6989586621680742300 ~> Bool) (t6989586621680742299 a6989586621680742300 ~> Bool) -> Type) (a6989586621680742841 :: a6989586621680742300 ~> Bool) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (AnySym0 :: TyFun (a6989586621680742300 ~> Bool) (t6989586621680742299 a6989586621680742300 ~> Bool) -> Type) (a6989586621680742841 :: a6989586621680742300 ~> Bool) = AnySym1 a6989586621680742841 t6989586621680742299 :: TyFun (t6989586621680742299 a6989586621680742300) Bool -> Type
type Apply (Let6989586621680742847Scrutinee_6989586621680742632Sym0 :: TyFun (a6989586621680742384 ~> Bool) (TyFun (t6989586621680742381 a6989586621680742384) Any -> Type) -> Type) (p6989586621680742845 :: a6989586621680742384 ~> Bool) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Let6989586621680742847Scrutinee_6989586621680742632Sym0 :: TyFun (a6989586621680742384 ~> Bool) (TyFun (t6989586621680742381 a6989586621680742384) Any -> Type) -> Type) (p6989586621680742845 :: a6989586621680742384 ~> Bool) = Let6989586621680742847Scrutinee_6989586621680742632Sym1 p6989586621680742845 :: TyFun (t6989586621680742381 a6989586621680742384) Any -> Type
type Apply (AllSym0 :: TyFun (a6989586621680742298 ~> Bool) (t6989586621680742297 a6989586621680742298 ~> Bool) -> Type) (a6989586621680742828 :: a6989586621680742298 ~> Bool) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (AllSym0 :: TyFun (a6989586621680742298 ~> Bool) (t6989586621680742297 a6989586621680742298 ~> Bool) -> Type) (a6989586621680742828 :: a6989586621680742298 ~> Bool) = AllSym1 a6989586621680742828 t6989586621680742297 :: TyFun (t6989586621680742297 a6989586621680742298) Bool -> Type
type Apply (Let6989586621680742834Scrutinee_6989586621680742634Sym0 :: TyFun (a6989586621680742384 ~> Bool) (TyFun (t6989586621680742381 a6989586621680742384) All -> Type) -> Type) (p6989586621680742832 :: a6989586621680742384 ~> Bool) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Let6989586621680742834Scrutinee_6989586621680742634Sym0 :: TyFun (a6989586621680742384 ~> Bool) (TyFun (t6989586621680742381 a6989586621680742384) All -> Type) -> Type) (p6989586621680742832 :: a6989586621680742384 ~> Bool) = Let6989586621680742834Scrutinee_6989586621680742634Sym1 p6989586621680742832 :: TyFun (t6989586621680742381 a6989586621680742384) All -> Type
type Apply (FindSym0 :: TyFun (a6989586621680742290 ~> Bool) (t6989586621680742289 a6989586621680742290 ~> Maybe a6989586621680742290) -> Type) (a6989586621680742743 :: a6989586621680742290 ~> Bool) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (FindSym0 :: TyFun (a6989586621680742290 ~> Bool) (t6989586621680742289 a6989586621680742290 ~> Maybe a6989586621680742290) -> Type) (a6989586621680742743 :: a6989586621680742290 ~> Bool) = FindSym1 a6989586621680742743 t6989586621680742289 :: TyFun (t6989586621680742289 a6989586621680742290) (Maybe a6989586621680742290) -> Type
type Apply (Let6989586621680742749Scrutinee_6989586621680742640Sym0 :: TyFun (a6989586621680742384 ~> Bool) (TyFun (t6989586621680742381 a6989586621680742384) (First a6989586621680742384) -> Type) -> Type) (p6989586621680742747 :: a6989586621680742384 ~> Bool) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Let6989586621680742749Scrutinee_6989586621680742640Sym0 :: TyFun (a6989586621680742384 ~> Bool) (TyFun (t6989586621680742381 a6989586621680742384) (First a6989586621680742384) -> Type) -> Type) (p6989586621680742747 :: a6989586621680742384 ~> Bool) = Let6989586621680742749Scrutinee_6989586621680742640Sym1 p6989586621680742747 :: TyFun (t6989586621680742381 a6989586621680742384) (First a6989586621680742384) -> Type
type Apply (Let6989586621679941729GoSym0 :: TyFun (k1 ~> Bool) (TyFun (k1 ~> k1) (TyFun k2 (TyFun k1 k1 -> Type) -> Type) -> Type) -> Type) (p6989586621679941726 :: k1 ~> Bool) 
Instance details

Defined in Data.Singletons.Prelude.Base

type Apply (Let6989586621679941729GoSym0 :: TyFun (k1 ~> Bool) (TyFun (k1 ~> k1) (TyFun k2 (TyFun k1 k1 -> Type) -> Type) -> Type) -> Type) (p6989586621679941726 :: k1 ~> Bool) = Let6989586621679941729GoSym1 p6989586621679941726 :: TyFun (k1 ~> k1) (TyFun k2 (TyFun k1 k1 -> Type) -> Type) -> Type
type Apply (MfilterSym0 :: TyFun (a6989586621681401666 ~> Bool) (m6989586621681401665 a6989586621681401666 ~> m6989586621681401665 a6989586621681401666) -> Type) (a6989586621681401985 :: a6989586621681401666 ~> Bool) 
Instance details

Defined in Data.Singletons.Prelude.Monad

type Apply (MfilterSym0 :: TyFun (a6989586621681401666 ~> Bool) (m6989586621681401665 a6989586621681401666 ~> m6989586621681401665 a6989586621681401666) -> Type) (a6989586621681401985 :: a6989586621681401666 ~> Bool) = MfilterSym1 a6989586621681401985 m6989586621681401665 :: TyFun (m6989586621681401665 a6989586621681401666) (m6989586621681401665 a6989586621681401666) -> Type
type Apply (FilterMSym0 :: TyFun (a6989586621681401704 ~> m6989586621681401703 Bool) ([a6989586621681401704] ~> m6989586621681401703 [a6989586621681401704]) -> Type) (a6989586621681402151 :: a6989586621681401704 ~> m6989586621681401703 Bool) 
Instance details

Defined in Data.Singletons.Prelude.Monad

type Apply (FilterMSym0 :: TyFun (a6989586621681401704 ~> m6989586621681401703 Bool) ([a6989586621681401704] ~> m6989586621681401703 [a6989586621681401704]) -> Type) (a6989586621681402151 :: a6989586621681401704 ~> m6989586621681401703 Bool) = FilterMSym1 a6989586621681402151
type Apply (Lambda_6989586621681401991Sym0 :: TyFun (k1 ~> Bool) (TyFun k (TyFun k1 (m6989586621679962831 k1) -> Type) -> Type) -> Type) (p6989586621681401989 :: k1 ~> Bool) 
Instance details

Defined in Data.Singletons.Prelude.Monad

type Apply (Lambda_6989586621681401991Sym0 :: TyFun (k1 ~> Bool) (TyFun k (TyFun k1 (m6989586621679962831 k1) -> Type) -> Type) -> Type) (p6989586621681401989 :: k1 ~> Bool) = Lambda_6989586621681401991Sym1 p6989586621681401989 :: TyFun k (TyFun k1 (m6989586621679962831 k1) -> Type) -> Type
type Apply (Lambda_6989586621681402159Sym0 :: TyFun (k2 ~> f6989586621679962807 Bool) (TyFun k3 (TyFun k2 (TyFun (f6989586621679962807 [k2]) (f6989586621679962807 [k2]) -> Type) -> Type) -> Type) -> Type) (p6989586621681402157 :: k2 ~> f6989586621679962807 Bool) 
Instance details

Defined in Data.Singletons.Prelude.Monad

type Apply (Lambda_6989586621681402159Sym0 :: TyFun (k2 ~> f6989586621679962807 Bool) (TyFun k3 (TyFun k2 (TyFun (f6989586621679962807 [k2]) (f6989586621679962807 [k2]) -> Type) -> Type) -> Type) -> Type) (p6989586621681402157 :: k2 ~> f6989586621679962807 Bool) = Lambda_6989586621681402159Sym1 p6989586621681402157 :: TyFun k3 (TyFun k2 (TyFun (f6989586621679962807 [k2]) (f6989586621679962807 [k2]) -> Type) -> Type) -> Type
type Apply (Lambda_6989586621680320828Sym0 :: TyFun (b6989586621679962835 ~> (a6989586621680316420 ~> Bool)) (TyFun k1 (TyFun k2 (TyFun a6989586621680316420 (TyFun [a6989586621680316420] (TyFun b6989586621679962835 (m6989586621679962831 b6989586621679962835) -> Type) -> Type) -> Type) -> Type) -> Type) -> Type) (eq6989586621680320812 :: b6989586621679962835 ~> (a6989586621680316420 ~> Bool)) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (Lambda_6989586621680320828Sym0 :: TyFun (b6989586621679962835 ~> (a6989586621680316420 ~> Bool)) (TyFun k1 (TyFun k2 (TyFun a6989586621680316420 (TyFun [a6989586621680316420] (TyFun b6989586621679962835 (m6989586621679962831 b6989586621679962835) -> Type) -> Type) -> Type) -> Type) -> Type) -> Type) (eq6989586621680320812 :: b6989586621679962835 ~> (a6989586621680316420 ~> Bool)) = Lambda_6989586621680320828Sym1 eq6989586621680320812 :: TyFun k1 (TyFun k2 (TyFun a6989586621680316420 (TyFun [a6989586621680316420] (TyFun b6989586621679962835 (m6989586621679962831 b6989586621679962835) -> Type) -> Type) -> Type) -> Type) -> Type
type Apply (Let6989586621680320760Scrutinee_6989586621680316995Sym2 xs6989586621680320759 x6989586621680320758 :: TyFun (k1 ~> Bool) (TyFun k Bool -> Type) -> Type) (p6989586621680320754 :: k1 ~> Bool) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (Let6989586621680320760Scrutinee_6989586621680316995Sym2 xs6989586621680320759 x6989586621680320758 :: TyFun (k1 ~> Bool) (TyFun k Bool -> Type) -> Type) (p6989586621680320754 :: k1 ~> Bool) = Let6989586621680320760Scrutinee_6989586621680316995Sym3 xs6989586621680320759 x6989586621680320758 p6989586621680320754 :: TyFun k Bool -> Type
type Apply (Let6989586621680320438Scrutinee_6989586621680317023Sym3 xs6989586621680320437 ys6989586621680320436 y6989586621680320435 :: TyFun (k1 ~> (k1 ~> Bool)) (TyFun k3 Bool -> Type) -> Type) (eq6989586621680320426 :: k1 ~> (k1 ~> Bool)) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (Let6989586621680320438Scrutinee_6989586621680317023Sym3 xs6989586621680320437 ys6989586621680320436 y6989586621680320435 :: TyFun (k1 ~> (k1 ~> Bool)) (TyFun k3 Bool -> Type) -> Type) (eq6989586621680320426 :: k1 ~> (k1 ~> Bool)) = Let6989586621680320438Scrutinee_6989586621680317023Sym4 xs6989586621680320437 ys6989586621680320436 y6989586621680320435 eq6989586621680320426 :: TyFun k3 Bool -> Type

data Char #

The character type Char is an enumeration whose values represent Unicode (or equivalently ISO/IEC 10646) code points (i.e. characters, see http://www.unicode.org/ for details). This set extends the ISO 8859-1 (Latin-1) character set (the first 256 characters), which is itself an extension of the ASCII character set (the first 128 characters). A character literal in Haskell has type Char.

To convert a Char to or from the corresponding Int value defined by Unicode, use toEnum and fromEnum from the Enum class respectively (or equivalently ord and chr).

Instances

Instances details
Bounded Char

Since: base-2.1

Instance details

Defined in GHC.Enum

Enum Char

Since: base-2.1

Instance details

Defined in GHC.Enum

Methods

succ :: Char -> Char #

pred :: Char -> Char #

toEnum :: Int -> Char #

fromEnum :: Char -> Int #

enumFrom :: Char -> [Char] #

enumFromThen :: Char -> Char -> [Char] #

enumFromTo :: Char -> Char -> [Char] #

enumFromThenTo :: Char -> Char -> Char -> [Char] #

Eq Char 
Instance details

Defined in GHC.Classes

Methods

(==) :: Char -> Char -> Bool #

(/=) :: Char -> Char -> Bool #

Data Char

Since: base-4.0.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Char -> c Char #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Char #

toConstr :: Char -> Constr #

dataTypeOf :: Char -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Char) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Char) #

gmapT :: (forall b. Data b => b -> b) -> Char -> Char #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Char -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Char -> r #

gmapQ :: (forall d. Data d => d -> u) -> Char -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Char -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Char -> m Char #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Char -> m Char #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Char -> m Char #

Ord Char 
Instance details

Defined in GHC.Classes

Methods

compare :: Char -> Char -> Ordering #

(<) :: Char -> Char -> Bool #

(<=) :: Char -> Char -> Bool #

(>) :: Char -> Char -> Bool #

(>=) :: Char -> Char -> Bool #

max :: Char -> Char -> Char #

min :: Char -> Char -> Char #

Read Char

Since: base-2.1

Instance details

Defined in GHC.Read

Show Char

Since: base-2.1

Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> Char -> ShowS #

show :: Char -> String #

showList :: [Char] -> ShowS #

Lift Char 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

lift :: Char -> Q Exp #

Hashable Char 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Char -> Int #

hash :: Char -> Int #

Storable Char

Since: base-2.1

Instance details

Defined in Foreign.Storable

Methods

sizeOf :: Char -> Int #

alignment :: Char -> Int #

peekElemOff :: Ptr Char -> Int -> IO Char #

pokeElemOff :: Ptr Char -> Int -> Char -> IO () #

peekByteOff :: Ptr b -> Int -> IO Char #

pokeByteOff :: Ptr b -> Int -> Char -> IO () #

peek :: Ptr Char -> IO Char #

poke :: Ptr Char -> Char -> IO () #

PrimType Char 
Instance details

Defined in Basement.PrimType

Associated Types

type PrimSize Char :: Nat #

PrimMemoryComparable Char 
Instance details

Defined in Basement.PrimType

Subtractive Char 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference Char #

Methods

(-) :: Char -> Char -> Difference Char #

NFData Char 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Char -> () #

Unbox Char 
Instance details

Defined in Data.Vector.Unboxed.Base

Stream String 
Instance details

Defined in Text.Megaparsec.Stream

Associated Types

type Token String #

type Tokens String #

ToString String 
Instance details

Defined in Universum.String.Conversion

Methods

toString :: String -> String #

ToLText String 
Instance details

Defined in Universum.String.Conversion

Methods

toLText :: String -> Text #

ToText String 
Instance details

Defined in Universum.String.Conversion

Methods

toText :: String -> Text #

ErrorList Char 
Instance details

Defined in Control.Monad.Trans.Error

Methods

listMsg :: String -> [Char] #

Vector Vector Char 
Instance details

Defined in Data.Vector.Unboxed.Base

ConvertUtf8 String ByteString 
Instance details

Defined in Universum.String.Conversion

ConvertUtf8 String ByteString 
Instance details

Defined in Universum.String.Conversion

MVector MVector Char 
Instance details

Defined in Data.Vector.Unboxed.Base

KnownSymbol n => Reifies (n :: Symbol) String 
Instance details

Defined in Data.Reflection

Methods

reflect :: proxy n -> String #

() :=> (Bounded Char) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Bounded Char #

() :=> (Enum Char) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Enum Char #

() :=> (Ord Char) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Ord Char #

() :=> (Read Char) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Read Char #

() :=> (Show Char) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Show Char #

Generic1 (URec Char :: k -> Type)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Associated Types

type Rep1 (URec Char) :: k -> Type #

Methods

from1 :: forall (a :: k0). URec Char a -> Rep1 (URec Char) a #

to1 :: forall (a :: k0). Rep1 (URec Char) a -> URec Char a #

Print [Char] 
Instance details

Defined in Universum.Print.Internal

Methods

hPutStr :: Handle -> [Char] -> IO () #

hPutStrLn :: Handle -> [Char] -> IO () #

Functor (URec Char :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

fmap :: (a -> b) -> URec Char a -> URec Char b #

(<$) :: a -> URec Char b -> URec Char a #

Foldable (URec Char :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => URec Char m -> m #

foldMap :: Monoid m => (a -> m) -> URec Char a -> m #

foldMap' :: Monoid m => (a -> m) -> URec Char a -> m #

foldr :: (a -> b -> b) -> b -> URec Char a -> b #

foldr' :: (a -> b -> b) -> b -> URec Char a -> b #

foldl :: (b -> a -> b) -> b -> URec Char a -> b #

foldl' :: (b -> a -> b) -> b -> URec Char a -> b #

foldr1 :: (a -> a -> a) -> URec Char a -> a #

foldl1 :: (a -> a -> a) -> URec Char a -> a #

toList :: URec Char a -> [a] #

null :: URec Char a -> Bool #

length :: URec Char a -> Int #

elem :: Eq a => a -> URec Char a -> Bool #

maximum :: Ord a => URec Char a -> a #

minimum :: Ord a => URec Char a -> a #

sum :: Num a => URec Char a -> a #

product :: Num a => URec Char a -> a #

Traversable (URec Char :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> URec Char a -> f (URec Char b) #

sequenceA :: Applicative f => URec Char (f a) -> f (URec Char a) #

mapM :: Monad m => (a -> m b) -> URec Char a -> m (URec Char b) #

sequence :: Monad m => URec Char (m a) -> m (URec Char a) #

SMonadFail m => SingI (FailSym0 :: TyFun [Char] (m a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Fail

Methods

sing :: Sing FailSym0 #

SuppressUnusedWarnings (Fail_6989586621680104799Sym0 :: TyFun [Char] (m6989586621680104770 a6989586621680104771) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Fail

SuppressUnusedWarnings (Fail_6989586621680104793Sym0 :: TyFun [Char] (m6989586621680104770 a6989586621680104771) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Fail

SuppressUnusedWarnings (FailSym0 :: TyFun [Char] (m6989586621680104770 a6989586621680104771) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Fail

Eq (URec Char p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

(==) :: URec Char p -> URec Char p -> Bool #

(/=) :: URec Char p -> URec Char p -> Bool #

Ord (URec Char p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

compare :: URec Char p -> URec Char p -> Ordering #

(<) :: URec Char p -> URec Char p -> Bool #

(<=) :: URec Char p -> URec Char p -> Bool #

(>) :: URec Char p -> URec Char p -> Bool #

(>=) :: URec Char p -> URec Char p -> Bool #

max :: URec Char p -> URec Char p -> URec Char p #

min :: URec Char p -> URec Char p -> URec Char p #

Show (URec Char p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

showsPrec :: Int -> URec Char p -> ShowS #

show :: URec Char p -> String #

showList :: [URec Char p] -> ShowS #

Generic (URec Char p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Associated Types

type Rep (URec Char p) :: Type -> Type #

Methods

from :: URec Char p -> Rep (URec Char p) x #

to :: Rep (URec Char p) x -> URec Char p #

type PrimSize Char 
Instance details

Defined in Basement.PrimType

type PrimSize Char = 4
type Difference Char 
Instance details

Defined in Basement.Numerical.Subtractive

type NatNumMaxBound Char 
Instance details

Defined in Basement.Nat

type NatNumMaxBound Char = 1114111
newtype Vector Char 
Instance details

Defined in Data.Vector.Unboxed.Base

type Tokens String 
Instance details

Defined in Text.Megaparsec.Stream

type Token String 
Instance details

Defined in Text.Megaparsec.Stream

data URec Char (p :: k)

Used for marking occurrences of Char#

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

data URec Char (p :: k) = UChar {}
newtype MVector s Char 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype MVector s Char = MV_Char (MVector s Char)
type Rep1 (URec Char :: k -> Type) 
Instance details

Defined in GHC.Generics

type Rep1 (URec Char :: k -> Type) = D1 ('MetaData "URec" "GHC.Generics" "base" 'False) (C1 ('MetaCons "UChar" 'PrefixI 'True) (S1 ('MetaSel ('Just "uChar#") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (UChar :: k -> Type)))
type Apply (FailSym0 :: TyFun [Char] (m6989586621680104770 a6989586621680104771) -> Type) (arg6989586621680104790 :: [Char]) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Fail

type Apply (FailSym0 :: TyFun [Char] (m6989586621680104770 a6989586621680104771) -> Type) (arg6989586621680104790 :: [Char]) = Fail arg6989586621680104790 :: m6989586621680104770 a6989586621680104771
type Apply (Fail_6989586621680104793Sym0 :: TyFun [Char] (m6989586621680104770 a6989586621680104771) -> Type) (a6989586621680104792 :: [Char]) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Fail

type Apply (Fail_6989586621680104793Sym0 :: TyFun [Char] (m6989586621680104770 a6989586621680104771) -> Type) (a6989586621680104792 :: [Char]) = Fail_6989586621680104793 a6989586621680104792 :: m6989586621680104770 a6989586621680104771
type Apply (Fail_6989586621680104799Sym0 :: TyFun [Char] (m6989586621680104770 a6989586621680104771) -> Type) (a6989586621680104798 :: [Char]) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Fail

type Apply (Fail_6989586621680104799Sym0 :: TyFun [Char] (m6989586621680104770 a6989586621680104771) -> Type) (a6989586621680104798 :: [Char]) = Fail_6989586621680104799 a6989586621680104798 :: m6989586621680104770 a6989586621680104771
type Rep (URec Char p) 
Instance details

Defined in GHC.Generics

type Rep (URec Char p) = D1 ('MetaData "URec" "GHC.Generics" "base" 'False) (C1 ('MetaCons "UChar" 'PrefixI 'True) (S1 ('MetaSel ('Just "uChar#") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (UChar :: Type -> Type)))

data Double #

Double-precision floating point numbers. It is desirable that this type be at least equal in range and precision to the IEEE double-precision type.

Constructors

D# Double# 

Instances

Instances details
Eq Double

Note that due to the presence of NaN, Double's Eq instance does not satisfy reflexivity.

>>> 0/0 == (0/0 :: Double)
False

Also note that Double's Eq instance does not satisfy substitutivity:

>>> 0 == (-0 :: Double)
True
>>> recip 0 == recip (-0 :: Double)
False
Instance details

Defined in GHC.Classes

Methods

(==) :: Double -> Double -> Bool #

(/=) :: Double -> Double -> Bool #

Floating Double

Since: base-2.1

Instance details

Defined in GHC.Float

Data Double

Since: base-4.0.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Double -> c Double #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Double #

toConstr :: Double -> Constr #

dataTypeOf :: Double -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Double) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Double) #

gmapT :: (forall b. Data b => b -> b) -> Double -> Double #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Double -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Double -> r #

gmapQ :: (forall d. Data d => d -> u) -> Double -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Double -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Double -> m Double #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Double -> m Double #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Double -> m Double #

Ord Double

Note that due to the presence of NaN, Double's Ord instance does not satisfy reflexivity.

>>> 0/0 <= (0/0 :: Double)
False

Also note that, due to the same, Ord's operator interactions are not respected by Double's instance:

>>> (0/0 :: Double) > 1
False
>>> compare (0/0 :: Double) 1
GT
Instance details

Defined in GHC.Classes

Read Double

Since: base-2.1

Instance details

Defined in GHC.Read

RealFloat Double

Since: base-2.1

Instance details

Defined in GHC.Float

Lift Double 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

lift :: Double -> Q Exp #

Hashable Double

Note: prior to hashable-1.3.0.0, hash 0.0 /= hash (-0.0)

The hash of NaN is not well defined.

Since: hashable-1.3.0.0

Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Double -> Int #

hash :: Double -> Int #

Storable Double

Since: base-2.1

Instance details

Defined in Foreign.Storable

PrimType Double 
Instance details

Defined in Basement.PrimType

Associated Types

type PrimSize Double :: Nat #

Subtractive Double 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference Double #

NFData Double 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Double -> () #

Default Double 
Instance details

Defined in Data.Default.Class

Methods

def :: Double #

Unbox Double 
Instance details

Defined in Data.Vector.Unboxed.Base

Vector Vector Double 
Instance details

Defined in Data.Vector.Unboxed.Base

MVector MVector Double 
Instance details

Defined in Data.Vector.Unboxed.Base

() :=> (Enum Double) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Enum Double #

() :=> (Eq Double) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Eq Double #

() :=> (Floating Double) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Floating Double #

() :=> (Fractional Double) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Fractional Double #

() :=> (Num Double) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Num Double #

() :=> (Ord Double) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Ord Double #

() :=> (Real Double) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Real Double #

() :=> (RealFloat Double) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- RealFloat Double #

() :=> (RealFrac Double) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- RealFrac Double #

Generic1 (URec Double :: k -> Type)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Associated Types

type Rep1 (URec Double) :: k -> Type #

Methods

from1 :: forall (a :: k0). URec Double a -> Rep1 (URec Double) a #

to1 :: forall (a :: k0). Rep1 (URec Double) a -> URec Double a #

Functor (URec Double :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

fmap :: (a -> b) -> URec Double a -> URec Double b #

(<$) :: a -> URec Double b -> URec Double a #

Foldable (URec Double :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => URec Double m -> m #

foldMap :: Monoid m => (a -> m) -> URec Double a -> m #

foldMap' :: Monoid m => (a -> m) -> URec Double a -> m #

foldr :: (a -> b -> b) -> b -> URec Double a -> b #

foldr' :: (a -> b -> b) -> b -> URec Double a -> b #

foldl :: (b -> a -> b) -> b -> URec Double a -> b #

foldl' :: (b -> a -> b) -> b -> URec Double a -> b #

foldr1 :: (a -> a -> a) -> URec Double a -> a #

foldl1 :: (a -> a -> a) -> URec Double a -> a #

toList :: URec Double a -> [a] #

null :: URec Double a -> Bool #

length :: URec Double a -> Int #

elem :: Eq a => a -> URec Double a -> Bool #

maximum :: Ord a => URec Double a -> a #

minimum :: Ord a => URec Double a -> a #

sum :: Num a => URec Double a -> a #

product :: Num a => URec Double a -> a #

Traversable (URec Double :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> URec Double a -> f (URec Double b) #

sequenceA :: Applicative f => URec Double (f a) -> f (URec Double a) #

mapM :: Monad m => (a -> m b) -> URec Double a -> m (URec Double b) #

sequence :: Monad m => URec Double (m a) -> m (URec Double a) #

Eq (URec Double p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

(==) :: URec Double p -> URec Double p -> Bool #

(/=) :: URec Double p -> URec Double p -> Bool #

Ord (URec Double p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

compare :: URec Double p -> URec Double p -> Ordering #

(<) :: URec Double p -> URec Double p -> Bool #

(<=) :: URec Double p -> URec Double p -> Bool #

(>) :: URec Double p -> URec Double p -> Bool #

(>=) :: URec Double p -> URec Double p -> Bool #

max :: URec Double p -> URec Double p -> URec Double p #

min :: URec Double p -> URec Double p -> URec Double p #

Show (URec Double p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

showsPrec :: Int -> URec Double p -> ShowS #

show :: URec Double p -> String #

showList :: [URec Double p] -> ShowS #

Generic (URec Double p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Associated Types

type Rep (URec Double p) :: Type -> Type #

Methods

from :: URec Double p -> Rep (URec Double p) x #

to :: Rep (URec Double p) x -> URec Double p #

type PrimSize Double 
Instance details

Defined in Basement.PrimType

type PrimSize Double = 8
type Difference Double 
Instance details

Defined in Basement.Numerical.Subtractive

newtype Vector Double 
Instance details

Defined in Data.Vector.Unboxed.Base

data URec Double (p :: k)

Used for marking occurrences of Double#

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

data URec Double (p :: k) = UDouble {}
newtype MVector s Double 
Instance details

Defined in Data.Vector.Unboxed.Base

type Rep1 (URec Double :: k -> Type) 
Instance details

Defined in GHC.Generics

type Rep1 (URec Double :: k -> Type) = D1 ('MetaData "URec" "GHC.Generics" "base" 'False) (C1 ('MetaCons "UDouble" 'PrefixI 'True) (S1 ('MetaSel ('Just "uDouble#") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (UDouble :: k -> Type)))
type Rep (URec Double p) 
Instance details

Defined in GHC.Generics

type Rep (URec Double p) = D1 ('MetaData "URec" "GHC.Generics" "base" 'False) (C1 ('MetaCons "UDouble" 'PrefixI 'True) (S1 ('MetaSel ('Just "uDouble#") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (UDouble :: Type -> Type)))

data Float #

Single-precision floating point numbers. It is desirable that this type be at least equal in range and precision to the IEEE single-precision type.

Constructors

F# Float# 

Instances

Instances details
Eq Float

Note that due to the presence of NaN, Float's Eq instance does not satisfy reflexivity.

>>> 0/0 == (0/0 :: Float)
False

Also note that Float's Eq instance does not satisfy substitutivity:

>>> 0 == (-0 :: Float)
True
>>> recip 0 == recip (-0 :: Float)
False
Instance details

Defined in GHC.Classes

Methods

(==) :: Float -> Float -> Bool #

(/=) :: Float -> Float -> Bool #

Floating Float

Since: base-2.1

Instance details

Defined in GHC.Float

Data Float

Since: base-4.0.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Float -> c Float #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Float #

toConstr :: Float -> Constr #

dataTypeOf :: Float -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Float) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Float) #

gmapT :: (forall b. Data b => b -> b) -> Float -> Float #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Float -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Float -> r #

gmapQ :: (forall d. Data d => d -> u) -> Float -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Float -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Float -> m Float #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Float -> m Float #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Float -> m Float #

Ord Float

Note that due to the presence of NaN, Float's Ord instance does not satisfy reflexivity.

>>> 0/0 <= (0/0 :: Float)
False

Also note that, due to the same, Ord's operator interactions are not respected by Float's instance:

>>> (0/0 :: Float) > 1
False
>>> compare (0/0 :: Float) 1
GT
Instance details

Defined in GHC.Classes

Methods

compare :: Float -> Float -> Ordering #

(<) :: Float -> Float -> Bool #

(<=) :: Float -> Float -> Bool #

(>) :: Float -> Float -> Bool #

(>=) :: Float -> Float -> Bool #

max :: Float -> Float -> Float #

min :: Float -> Float -> Float #

Read Float

Since: base-2.1

Instance details

Defined in GHC.Read

RealFloat Float

Since: base-2.1

Instance details

Defined in GHC.Float

Lift Float 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

lift :: Float -> Q Exp #

Hashable Float

Note: prior to hashable-1.3.0.0, hash 0.0 /= hash (-0.0)

The hash of NaN is not well defined.

Since: hashable-1.3.0.0

Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Float -> Int #

hash :: Float -> Int #

Storable Float

Since: base-2.1

Instance details

Defined in Foreign.Storable

Methods

sizeOf :: Float -> Int #

alignment :: Float -> Int #

peekElemOff :: Ptr Float -> Int -> IO Float #

pokeElemOff :: Ptr Float -> Int -> Float -> IO () #

peekByteOff :: Ptr b -> Int -> IO Float #

pokeByteOff :: Ptr b -> Int -> Float -> IO () #

peek :: Ptr Float -> IO Float #

poke :: Ptr Float -> Float -> IO () #

PrimType Float 
Instance details

Defined in Basement.PrimType

Associated Types

type PrimSize Float :: Nat #

Subtractive Float 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference Float #

Methods

(-) :: Float -> Float -> Difference Float #

NFData Float 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Float -> () #

Default Float 
Instance details

Defined in Data.Default.Class

Methods

def :: Float #

Unbox Float 
Instance details

Defined in Data.Vector.Unboxed.Base

Vector Vector Float 
Instance details

Defined in Data.Vector.Unboxed.Base

MVector MVector Float 
Instance details

Defined in Data.Vector.Unboxed.Base

() :=> (Enum Float) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Enum Float #

() :=> (Eq Float) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Eq Float #

() :=> (Floating Float) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Floating Float #

() :=> (Fractional Float) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Fractional Float #

() :=> (Num Float) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Num Float #

() :=> (Ord Float) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Ord Float #

() :=> (Real Float) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Real Float #

() :=> (RealFloat Float) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- RealFloat Float #

() :=> (RealFrac Float) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- RealFrac Float #

Generic1 (URec Float :: k -> Type)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Associated Types

type Rep1 (URec Float) :: k -> Type #

Methods

from1 :: forall (a :: k0). URec Float a -> Rep1 (URec Float) a #

to1 :: forall (a :: k0). Rep1 (URec Float) a -> URec Float a #

Functor (URec Float :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

fmap :: (a -> b) -> URec Float a -> URec Float b #

(<$) :: a -> URec Float b -> URec Float a #

Foldable (URec Float :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => URec Float m -> m #

foldMap :: Monoid m => (a -> m) -> URec Float a -> m #

foldMap' :: Monoid m => (a -> m) -> URec Float a -> m #

foldr :: (a -> b -> b) -> b -> URec Float a -> b #

foldr' :: (a -> b -> b) -> b -> URec Float a -> b #

foldl :: (b -> a -> b) -> b -> URec Float a -> b #

foldl' :: (b -> a -> b) -> b -> URec Float a -> b #

foldr1 :: (a -> a -> a) -> URec Float a -> a #

foldl1 :: (a -> a -> a) -> URec Float a -> a #

toList :: URec Float a -> [a] #

null :: URec Float a -> Bool #

length :: URec Float a -> Int #

elem :: Eq a => a -> URec Float a -> Bool #

maximum :: Ord a => URec Float a -> a #

minimum :: Ord a => URec Float a -> a #

sum :: Num a => URec Float a -> a #

product :: Num a => URec Float a -> a #

Traversable (URec Float :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> URec Float a -> f (URec Float b) #

sequenceA :: Applicative f => URec Float (f a) -> f (URec Float a) #

mapM :: Monad m => (a -> m b) -> URec Float a -> m (URec Float b) #

sequence :: Monad m => URec Float (m a) -> m (URec Float a) #

Eq (URec Float p) 
Instance details

Defined in GHC.Generics

Methods

(==) :: URec Float p -> URec Float p -> Bool #

(/=) :: URec Float p -> URec Float p -> Bool #

Ord (URec Float p) 
Instance details

Defined in GHC.Generics

Methods

compare :: URec Float p -> URec Float p -> Ordering #

(<) :: URec Float p -> URec Float p -> Bool #

(<=) :: URec Float p -> URec Float p -> Bool #

(>) :: URec Float p -> URec Float p -> Bool #

(>=) :: URec Float p -> URec Float p -> Bool #

max :: URec Float p -> URec Float p -> URec Float p #

min :: URec Float p -> URec Float p -> URec Float p #

Show (URec Float p) 
Instance details

Defined in GHC.Generics

Methods

showsPrec :: Int -> URec Float p -> ShowS #

show :: URec Float p -> String #

showList :: [URec Float p] -> ShowS #

Generic (URec Float p) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (URec Float p) :: Type -> Type #

Methods

from :: URec Float p -> Rep (URec Float p) x #

to :: Rep (URec Float p) x -> URec Float p #

type PrimSize Float 
Instance details

Defined in Basement.PrimType

type PrimSize Float = 4
type Difference Float 
Instance details

Defined in Basement.Numerical.Subtractive

newtype Vector Float 
Instance details

Defined in Data.Vector.Unboxed.Base

data URec Float (p :: k)

Used for marking occurrences of Float#

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

data URec Float (p :: k) = UFloat {}
newtype MVector s Float 
Instance details

Defined in Data.Vector.Unboxed.Base

type Rep1 (URec Float :: k -> Type) 
Instance details

Defined in GHC.Generics

type Rep1 (URec Float :: k -> Type) = D1 ('MetaData "URec" "GHC.Generics" "base" 'False) (C1 ('MetaCons "UFloat" 'PrefixI 'True) (S1 ('MetaSel ('Just "uFloat#") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (UFloat :: k -> Type)))
type Rep (URec Float p) 
Instance details

Defined in GHC.Generics

type Rep (URec Float p) = D1 ('MetaData "URec" "GHC.Generics" "base" 'False) (C1 ('MetaCons "UFloat" 'PrefixI 'True) (S1 ('MetaSel ('Just "uFloat#") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (UFloat :: Type -> Type)))

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

Instances details
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 #

Data Int

Since: base-4.0.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Int -> c Int #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Int #

toConstr :: Int -> Constr #

dataTypeOf :: Int -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Int) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Int) #

gmapT :: (forall b. Data b => b -> b) -> Int -> Int #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Int -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Int -> r #

gmapQ :: (forall d. Data d => d -> u) -> Int -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Int -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Int -> m Int #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Int -> m Int #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Int -> m Int #

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 #

Lift Int 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

lift :: Int -> Q Exp #

Hashable Int 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Int -> Int #

hash :: Int -> Int #

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

PrimType Int 
Instance details

Defined in Basement.PrimType

Associated Types

type PrimSize Int :: Nat #

PrimMemoryComparable Int 
Instance details

Defined in Basement.PrimType

Subtractive Int 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference Int #

Methods

(-) :: Int -> Int -> Difference Int #

NFData Int 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Int -> () #

Default Int 
Instance details

Defined in Data.Default.Class

Methods

def :: Int #

Unbox Int 
Instance details

Defined in Data.Vector.Unboxed.Base

ByteSource Int 
Instance details

Defined in Data.UUID.Types.Internal.Builder

Methods

(/-/) :: ByteSink Int g -> Int -> g

Vector Vector Int 
Instance details

Defined in Data.Vector.Unboxed.Base

MVector MVector Int 
Instance details

Defined in Data.Vector.Unboxed.Base

() :=> (Bounded Int) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Bounded Int #

() :=> (Enum Int) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Enum Int #

() :=> (Eq Int) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Eq Int #

() :=> (Integral Int) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Integral Int #

() :=> (Num Int) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Num Int #

() :=> (Ord Int) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Ord Int #

() :=> (Read Int) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Read Int #

() :=> (Real Int) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Real Int #

() :=> (Show Int) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Show Int #

() :=> (Bits Int) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Bits Int #

Generic1 (URec Int :: k -> Type)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Associated Types

type Rep1 (URec Int) :: k -> Type #

Methods

from1 :: forall (a :: k0). URec Int a -> Rep1 (URec Int) a #

to1 :: forall (a :: k0). Rep1 (URec Int) a -> URec Int a #

Reifies Z Int 
Instance details

Defined in Data.Reflection

Methods

reflect :: proxy Z -> Int #

Reifies n Int => Reifies (D n :: Type) Int 
Instance details

Defined in Data.Reflection

Methods

reflect :: proxy (D n) -> Int #

Reifies n Int => Reifies (SD n :: Type) Int 
Instance details

Defined in Data.Reflection

Methods

reflect :: proxy (SD n) -> Int #

Reifies n Int => Reifies (PD n :: Type) Int 
Instance details

Defined in Data.Reflection

Methods

reflect :: proxy (PD n) -> Int #

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 #

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)

Since: base-4.9.0.0

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 #

type PrimSize Int 
Instance details

Defined in Basement.PrimType

type PrimSize Int = 8
type Difference Int 
Instance details

Defined in Basement.Numerical.Subtractive

type NatNumMaxBound Int 
Instance details

Defined in Basement.Nat

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 {}
type ByteSink Int g 
Instance details

Defined in Data.UUID.Types.Internal.Builder

type ByteSink Int g = Takes4Bytes g
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) 
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 Rep (URec Int p) 
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

Instances details
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 #

Data Int8

Since: base-4.0.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Int8 -> c Int8 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Int8 #

toConstr :: Int8 -> Constr #

dataTypeOf :: Int8 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Int8) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Int8) #

gmapT :: (forall b. Data b => b -> b) -> Int8 -> Int8 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Int8 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Int8 -> r #

gmapQ :: (forall d. Data d => d -> u) -> Int8 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Int8 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Int8 -> m Int8 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Int8 -> m Int8 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Int8 -> m Int8 #

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 #

Hashable Int8 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Int8 -> Int #

hash :: Int8 -> Int #

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

PrimType Int8 
Instance details

Defined in Basement.PrimType

Associated Types

type PrimSize Int8 :: Nat #

PrimMemoryComparable Int8 
Instance details

Defined in Basement.PrimType

Subtractive Int8 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference Int8 #

Methods

(-) :: Int8 -> Int8 -> Difference Int8 #

NFData Int8 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Int8 -> () #

Default Int8 
Instance details

Defined in Data.Default.Class

Methods

def :: Int8 #

Unbox Int8 
Instance details

Defined in Data.Vector.Unboxed.Base

Vector Vector Int8 
Instance details

Defined in Data.Vector.Unboxed.Base

MVector MVector Int8 
Instance details

Defined in Data.Vector.Unboxed.Base

type PrimSize Int8 
Instance details

Defined in Basement.PrimType

type PrimSize Int8 = 1
type Difference Int8 
Instance details

Defined in Basement.Numerical.Subtractive

type NatNumMaxBound Int8 
Instance details

Defined in Basement.Nat

type NatNumMaxBound Int8 = 127
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)

data Int16 #

16-bit signed integer type

Instances

Instances details
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

Data Int16

Since: base-4.0.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Int16 -> c Int16 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Int16 #

toConstr :: Int16 -> Constr #

dataTypeOf :: Int16 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Int16) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Int16) #

gmapT :: (forall b. Data b => b -> b) -> Int16 -> Int16 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Int16 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Int16 -> r #

gmapQ :: (forall d. Data d => d -> u) -> Int16 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Int16 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Int16 -> m Int16 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Int16 -> m Int16 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Int16 -> m Int16 #

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 #

Hashable Int16 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Int16 -> Int #

hash :: Int16 -> Int #

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

PrimType Int16 
Instance details

Defined in Basement.PrimType

Associated Types

type PrimSize Int16 :: Nat #

PrimMemoryComparable Int16 
Instance details

Defined in Basement.PrimType

Subtractive Int16 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference Int16 #

Methods

(-) :: Int16 -> Int16 -> Difference Int16 #

NFData Int16 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Int16 -> () #

Default Int16 
Instance details

Defined in Data.Default.Class

Methods

def :: Int16 #

Unbox Int16 
Instance details

Defined in Data.Vector.Unboxed.Base

Vector Vector Int16 
Instance details

Defined in Data.Vector.Unboxed.Base

MVector MVector Int16 
Instance details

Defined in Data.Vector.Unboxed.Base

type PrimSize Int16 
Instance details

Defined in Basement.PrimType

type PrimSize Int16 = 2
type Difference Int16 
Instance details

Defined in Basement.Numerical.Subtractive

type NatNumMaxBound Int16 
Instance details

Defined in Basement.Nat

type NatNumMaxBound Int16 = 32767
newtype Vector Int16 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype MVector s Int16 
Instance details

Defined in Data.Vector.Unboxed.Base

data Int32 #

32-bit signed integer type

Instances

Instances details
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

Data Int32

Since: base-4.0.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Int32 -> c Int32 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Int32 #

toConstr :: Int32 -> Constr #

dataTypeOf :: Int32 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Int32) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Int32) #

gmapT :: (forall b. Data b => b -> b) -> Int32 -> Int32 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Int32 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Int32 -> r #

gmapQ :: (forall d. Data d => d -> u) -> Int32 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Int32 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Int32 -> m Int32 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Int32 -> m Int32 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Int32 -> m Int32 #

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 #

Hashable Int32 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Int32 -> Int #

hash :: Int32 -> Int #

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

PrimType Int32 
Instance details

Defined in Basement.PrimType

Associated Types

type PrimSize Int32 :: Nat #

PrimMemoryComparable Int32 
Instance details

Defined in Basement.PrimType

Subtractive Int32 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference Int32 #

Methods

(-) :: Int32 -> Int32 -> Difference Int32 #

NFData Int32 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Int32 -> () #

Default Int32 
Instance details

Defined in Data.Default.Class

Methods

def :: Int32 #

Unbox Int32 
Instance details

Defined in Data.Vector.Unboxed.Base

Vector Vector Int32 
Instance details

Defined in Data.Vector.Unboxed.Base

MVector MVector Int32 
Instance details

Defined in Data.Vector.Unboxed.Base

type PrimSize Int32 
Instance details

Defined in Basement.PrimType

type PrimSize Int32 = 4
type Difference Int32 
Instance details

Defined in Basement.Numerical.Subtractive

type NatNumMaxBound Int32 
Instance details

Defined in Basement.Nat

type NatNumMaxBound Int32 = 2147483647
newtype Vector Int32 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype MVector s Int32 
Instance details

Defined in Data.Vector.Unboxed.Base

data Int64 #

64-bit signed integer type

Instances

Instances details
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

Data Int64

Since: base-4.0.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Int64 -> c Int64 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Int64 #

toConstr :: Int64 -> Constr #

dataTypeOf :: Int64 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Int64) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Int64) #

gmapT :: (forall b. Data b => b -> b) -> Int64 -> Int64 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Int64 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Int64 -> r #

gmapQ :: (forall d. Data d => d -> u) -> Int64 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Int64 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Int64 -> m Int64 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Int64 -> m Int64 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Int64 -> m Int64 #

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 #

Hashable Int64 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Int64 -> Int #

hash :: Int64 -> Int #

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

PrimType Int64 
Instance details

Defined in Basement.PrimType

Associated Types

type PrimSize Int64 :: Nat #

PrimMemoryComparable Int64 
Instance details

Defined in Basement.PrimType

Subtractive Int64 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference Int64 #

Methods

(-) :: Int64 -> Int64 -> Difference Int64 #

NFData Int64 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Int64 -> () #

Default Int64 
Instance details

Defined in Data.Default.Class

Methods

def :: Int64 #

Unbox Int64 
Instance details

Defined in Data.Vector.Unboxed.Base

Vector Vector Int64 
Instance details

Defined in Data.Vector.Unboxed.Base

MVector MVector Int64 
Instance details

Defined in Data.Vector.Unboxed.Base

type PrimSize Int64 
Instance details

Defined in Basement.PrimType

type PrimSize Int64 = 8
type Difference Int64 
Instance details

Defined in Basement.Numerical.Subtractive

type NatNumMaxBound Int64 
Instance details

Defined in Basement.Nat

type NatNumMaxBound Int64 = 9223372036854775807
newtype Vector Int64 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype MVector s Int64 
Instance details

Defined in Data.Vector.Unboxed.Base

data Integer #

Invariant: Jn# and Jp# are used iff value doesn't fit in S#

Useful properties resulting from the invariants:

Instances

Instances details
Enum Integer

Since: base-2.1

Instance details

Defined in GHC.Enum

Eq Integer 
Instance details

Defined in GHC.Integer.Type

Methods

(==) :: Integer -> Integer -> Bool #

(/=) :: Integer -> Integer -> Bool #

Integral Integer

Since: base-2.0.1

Instance details

Defined in GHC.Real

Data Integer

Since: base-4.0.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Integer -> c Integer #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Integer #

toConstr :: Integer -> Constr #

dataTypeOf :: Integer -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Integer) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Integer) #

gmapT :: (forall b. Data b => b -> b) -> Integer -> Integer #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Integer -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Integer -> r #

gmapQ :: (forall d. Data d => d -> u) -> Integer -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Integer -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Integer -> m Integer #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Integer -> m Integer #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Integer -> m Integer #

Num Integer

Since: base-2.1

Instance details

Defined in GHC.Num

Ord Integer 
Instance details

Defined in GHC.Integer.Type

Read Integer

Since: base-2.1

Instance details

Defined in GHC.Read

Real Integer

Since: base-2.0.1

Instance details

Defined in GHC.Real

Show Integer

Since: base-2.1

Instance details

Defined in GHC.Show

Lift Integer 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

lift :: Integer -> Q Exp #

Hashable Integer 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Integer -> Int #

hash :: Integer -> Int #

Bits Integer

Since: base-2.1

Instance details

Defined in Data.Bits

Subtractive Integer 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference Integer #

NFData Integer 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Integer -> () #

Default Integer 
Instance details

Defined in Data.Default.Class

Methods

def :: Integer #

NonZero Integer 
Instance details

Defined in Lorentz.Instr

Methods

nonZero :: forall (s :: [Type]). (Integer ': s) :-> (Maybe Integer ': s) #

HasAnnotation Integer 
Instance details

Defined in Lorentz.Annotation

IsoValue Integer 
Instance details

Defined in Michelson.Typed.Haskell.Value

Associated Types

type ToT Integer :: T #

TypeHasDoc Integer 
Instance details

Defined in Michelson.Typed.Haskell.Doc

UnaryArithOpHs Abs Integer 
Instance details

Defined in Lorentz.Arith

Associated Types

type UnaryArithResHs Abs Integer #

UnaryArithOpHs Neg Integer 
Instance details

Defined in Lorentz.Arith

Associated Types

type UnaryArithResHs Neg Integer #

UnaryArithOpHs Not Integer 
Instance details

Defined in Lorentz.Arith

Associated Types

type UnaryArithResHs Not Integer #

UnaryArithOpHs Eq' Integer 
Instance details

Defined in Lorentz.Arith

Associated Types

type UnaryArithResHs Eq' Integer #

UnaryArithOpHs Neq Integer 
Instance details

Defined in Lorentz.Arith

Associated Types

type UnaryArithResHs Neq Integer #

UnaryArithOpHs Lt Integer 
Instance details

Defined in Lorentz.Arith

Associated Types

type UnaryArithResHs Lt Integer #

UnaryArithOpHs Gt Integer 
Instance details

Defined in Lorentz.Arith

Associated Types

type UnaryArithResHs Gt Integer #

UnaryArithOpHs Le Integer 
Instance details

Defined in Lorentz.Arith

Associated Types

type UnaryArithResHs Le Integer #

UnaryArithOpHs Ge Integer 
Instance details

Defined in Lorentz.Arith

Associated Types

type UnaryArithResHs Ge Integer #

EDivOpHs Integer Integer 
Instance details

Defined in Lorentz.Polymorphic

EDivOpHs Integer Natural 
Instance details

Defined in Lorentz.Polymorphic

EDivOpHs Natural Integer 
Instance details

Defined in Lorentz.Polymorphic

ArithOpHs Add Integer Integer 
Instance details

Defined in Lorentz.Arith

Associated Types

type ArithResHs Add Integer Integer #

ArithOpHs Add Integer Natural 
Instance details

Defined in Lorentz.Arith

Associated Types

type ArithResHs Add Integer Natural #

ArithOpHs Add Integer Timestamp 
Instance details

Defined in Lorentz.Arith

Associated Types

type ArithResHs Add Integer Timestamp #

ArithOpHs Add Natural Integer 
Instance details

Defined in Lorentz.Arith

Associated Types

type ArithResHs Add Natural Integer #

ArithOpHs Add Timestamp Integer 
Instance details

Defined in Lorentz.Arith

Associated Types

type ArithResHs Add Timestamp Integer #

ArithOpHs Sub Integer Integer 
Instance details

Defined in Lorentz.Arith

Associated Types

type ArithResHs Sub Integer Integer #

ArithOpHs Sub Integer Natural 
Instance details

Defined in Lorentz.Arith

Associated Types

type ArithResHs Sub Integer Natural #

ArithOpHs Sub Natural Integer 
Instance details

Defined in Lorentz.Arith

Associated Types

type ArithResHs Sub Natural Integer #

ArithOpHs Sub Timestamp Integer 
Instance details

Defined in Lorentz.Arith

Associated Types

type ArithResHs Sub Timestamp Integer #

ArithOpHs Mul Integer Integer 
Instance details

Defined in Lorentz.Arith

Associated Types

type ArithResHs Mul Integer Integer #

ArithOpHs Mul Integer Natural 
Instance details

Defined in Lorentz.Arith

Associated Types

type ArithResHs Mul Integer Natural #

ArithOpHs Mul Natural Integer 
Instance details

Defined in Lorentz.Arith

Associated Types

type ArithResHs Mul Natural Integer #

ArithOpHs And Integer Natural 
Instance details

Defined in Lorentz.Arith

Associated Types

type ArithResHs And Integer Natural #

KnownNat n => Reifies (n :: Nat) Integer 
Instance details

Defined in Data.Reflection

Methods

reflect :: proxy n -> Integer #

() :=> (Enum Integer) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Enum Integer #

() :=> (Eq Integer) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Eq Integer #

() :=> (Integral Integer) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Integral Integer #

() :=> (Num Integer) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Num Integer #

() :=> (Ord Integer) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Ord Integer #

() :=> (Real Integer) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Real Integer #

() :=> (Bits Integer) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Bits Integer #

type Difference Integer 
Instance details

Defined in Basement.Numerical.Subtractive

type ToT Integer 
Instance details

Defined in Michelson.Typed.Haskell.Value

type ToT Integer = 'TInt
type TypeDocFieldDescriptions Integer 
Instance details

Defined in Michelson.Typed.Haskell.Doc

type UnaryArithResHs Abs Integer 
Instance details

Defined in Lorentz.Arith

type UnaryArithResHs Neg Integer 
Instance details

Defined in Lorentz.Arith

type UnaryArithResHs Not Integer 
Instance details

Defined in Lorentz.Arith

type UnaryArithResHs Eq' Integer 
Instance details

Defined in Lorentz.Arith

type UnaryArithResHs Neq Integer 
Instance details

Defined in Lorentz.Arith

type UnaryArithResHs Lt Integer 
Instance details

Defined in Lorentz.Arith

type UnaryArithResHs Gt Integer 
Instance details

Defined in Lorentz.Arith

type UnaryArithResHs Le Integer 
Instance details

Defined in Lorentz.Arith

type UnaryArithResHs Ge Integer 
Instance details

Defined in Lorentz.Arith

type EModOpResHs Integer Integer 
Instance details

Defined in Lorentz.Polymorphic

type EModOpResHs Integer Natural 
Instance details

Defined in Lorentz.Polymorphic

type EModOpResHs Natural Integer 
Instance details

Defined in Lorentz.Polymorphic

type EDivOpResHs Integer Integer 
Instance details

Defined in Lorentz.Polymorphic

type EDivOpResHs Integer Natural 
Instance details

Defined in Lorentz.Polymorphic

type EDivOpResHs Natural Integer 
Instance details

Defined in Lorentz.Polymorphic

type ArithResHs Add Integer Integer 
Instance details

Defined in Lorentz.Arith

type ArithResHs Add Integer Natural 
Instance details

Defined in Lorentz.Arith

type ArithResHs Add Integer Timestamp 
Instance details

Defined in Lorentz.Arith

type ArithResHs Add Natural Integer 
Instance details

Defined in Lorentz.Arith

type ArithResHs Add Timestamp Integer 
Instance details

Defined in Lorentz.Arith

type ArithResHs Sub Integer Integer 
Instance details

Defined in Lorentz.Arith

type ArithResHs Sub Integer Natural 
Instance details

Defined in Lorentz.Arith

type ArithResHs Sub Natural Integer 
Instance details

Defined in Lorentz.Arith

type ArithResHs Sub Timestamp Integer 
Instance details

Defined in Lorentz.Arith

type ArithResHs Mul Integer Integer 
Instance details

Defined in Lorentz.Arith

type ArithResHs Mul Integer Natural 
Instance details

Defined in Lorentz.Arith

type ArithResHs Mul Natural Integer 
Instance details

Defined in Lorentz.Arith

type ArithResHs And Integer Natural 
Instance details

Defined in Lorentz.Arith

data Natural #

Type representing arbitrary-precision non-negative integers.

>>> 2^100 :: Natural
1267650600228229401496703205376

Operations whose result would be negative throw (Underflow :: ArithException),

>>> -1 :: Natural
*** Exception: arithmetic underflow

Since: base-4.8.0.0

Instances

Instances details
Enum Natural

Since: base-4.8.0.0

Instance details

Defined in GHC.Enum

Eq Natural

Since: base-4.8.0.0

Instance details

Defined in GHC.Natural

Methods

(==) :: Natural -> Natural -> Bool #

(/=) :: Natural -> Natural -> Bool #

Integral Natural

Since: base-4.8.0.0

Instance details

Defined in GHC.Real

Data Natural

Since: base-4.8.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Natural -> c Natural #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Natural #

toConstr :: Natural -> Constr #

dataTypeOf :: Natural -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Natural) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Natural) #

gmapT :: (forall b. Data b => b -> b) -> Natural -> Natural #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Natural -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Natural -> r #

gmapQ :: (forall d. Data d => d -> u) -> Natural -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Natural -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Natural -> m Natural #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Natural -> m Natural #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Natural -> m Natural #

Num Natural

Note that Natural's Num instance isn't a ring: no element but 0 has an additive inverse. It is a semiring though.

Since: base-4.8.0.0

Instance details

Defined in GHC.Num

Ord Natural

Since: base-4.8.0.0

Instance details

Defined in GHC.Natural

Read Natural

Since: base-4.8.0.0

Instance details

Defined in GHC.Read

Real Natural

Since: base-4.8.0.0

Instance details

Defined in GHC.Real

Show Natural

Since: base-4.8.0.0

Instance details

Defined in GHC.Show

Lift Natural 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

lift :: Natural -> Q Exp #

Hashable Natural 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Natural -> Int #

hash :: Natural -> Int #

Bits Natural

Since: base-4.8.0

Instance details

Defined in Data.Bits

Subtractive Natural 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference Natural #

NFData Natural

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Natural -> () #

NonZero Natural 
Instance details

Defined in Lorentz.Instr

Methods

nonZero :: forall (s :: [Type]). (Natural ': s) :-> (Maybe Natural ': s) #

HasAnnotation Natural 
Instance details

Defined in Lorentz.Annotation

IsoValue Natural 
Instance details

Defined in Michelson.Typed.Haskell.Value

Associated Types

type ToT Natural :: T #

TypeHasDoc Natural 
Instance details

Defined in Michelson.Typed.Haskell.Doc

UnaryArithOpHs Neg Natural 
Instance details

Defined in Lorentz.Arith

Associated Types

type UnaryArithResHs Neg Natural #

UnaryArithOpHs Not Natural 
Instance details

Defined in Lorentz.Arith

Associated Types

type UnaryArithResHs Not Natural #

EDivOpHs Integer Natural 
Instance details

Defined in Lorentz.Polymorphic

EDivOpHs Natural Integer 
Instance details

Defined in Lorentz.Polymorphic

EDivOpHs Natural Natural 
Instance details

Defined in Lorentz.Polymorphic

EDivOpHs Mutez Natural 
Instance details

Defined in Lorentz.Polymorphic

Associated Types

type EDivOpResHs Mutez Natural #

type EModOpResHs Mutez Natural #

ArithOpHs Or Natural Natural 
Instance details

Defined in Lorentz.Arith

Associated Types

type ArithResHs Or Natural Natural #

ArithOpHs Add Integer Natural 
Instance details

Defined in Lorentz.Arith

Associated Types

type ArithResHs Add Integer Natural #

ArithOpHs Add Natural Integer 
Instance details

Defined in Lorentz.Arith

Associated Types

type ArithResHs Add Natural Integer #

ArithOpHs Add Natural Natural 
Instance details

Defined in Lorentz.Arith

Associated Types

type ArithResHs Add Natural Natural #

ArithOpHs Sub Integer Natural 
Instance details

Defined in Lorentz.Arith

Associated Types

type ArithResHs Sub Integer Natural #

ArithOpHs Sub Natural Integer 
Instance details

Defined in Lorentz.Arith

Associated Types

type ArithResHs Sub Natural Integer #

ArithOpHs Sub Natural Natural 
Instance details

Defined in Lorentz.Arith

Associated Types

type ArithResHs Sub Natural Natural #

ArithOpHs Mul Integer Natural 
Instance details

Defined in Lorentz.Arith

Associated Types

type ArithResHs Mul Integer Natural #

ArithOpHs Mul Natural Integer 
Instance details

Defined in Lorentz.Arith

Associated Types

type ArithResHs Mul Natural Integer #

ArithOpHs Mul Natural Natural 
Instance details

Defined in Lorentz.Arith

Associated Types

type ArithResHs Mul Natural Natural #

ArithOpHs Mul Natural Mutez 
Instance details

Defined in Lorentz.Arith

Associated Types

type ArithResHs Mul Natural Mutez #

ArithOpHs Mul Mutez Natural 
Instance details

Defined in Lorentz.Arith

Associated Types

type ArithResHs Mul Mutez Natural #

ArithOpHs And Integer Natural 
Instance details

Defined in Lorentz.Arith

Associated Types

type ArithResHs And Integer Natural #

ArithOpHs And Natural Natural 
Instance details

Defined in Lorentz.Arith

Associated Types

type ArithResHs And Natural Natural #

ArithOpHs Xor Natural Natural 
Instance details

Defined in Lorentz.Arith

Associated Types

type ArithResHs Xor Natural Natural #

ArithOpHs Lsl Natural Natural 
Instance details

Defined in Lorentz.Arith

Associated Types

type ArithResHs Lsl Natural Natural #

ArithOpHs Lsr Natural Natural 
Instance details

Defined in Lorentz.Arith

Associated Types

type ArithResHs Lsr Natural Natural #

() :=> (Enum Natural) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Enum Natural #

() :=> (Eq Natural) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Eq Natural #

() :=> (Integral Natural) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Integral Natural #

() :=> (Num Natural) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Num Natural #

() :=> (Ord Natural) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Ord Natural #

() :=> (Read Natural) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Read Natural #

() :=> (Real Natural) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Real Natural #

() :=> (Show Natural) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Show Natural #

() :=> (Bits Natural) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Bits Natural #

type Difference Natural 
Instance details

Defined in Basement.Numerical.Subtractive

type ToT Natural 
Instance details

Defined in Michelson.Typed.Haskell.Value

type ToT Natural = 'TNat
type TypeDocFieldDescriptions Natural 
Instance details

Defined in Michelson.Typed.Haskell.Doc

type UnaryArithResHs Neg Natural 
Instance details

Defined in Lorentz.Arith

type UnaryArithResHs Not Natural 
Instance details

Defined in Lorentz.Arith

type EModOpResHs Integer Natural 
Instance details

Defined in Lorentz.Polymorphic

type EModOpResHs Natural Integer 
Instance details

Defined in Lorentz.Polymorphic

type EModOpResHs Natural Natural 
Instance details

Defined in Lorentz.Polymorphic

type EModOpResHs Mutez Natural 
Instance details

Defined in Lorentz.Polymorphic

type EDivOpResHs Integer Natural 
Instance details

Defined in Lorentz.Polymorphic

type EDivOpResHs Natural Integer 
Instance details

Defined in Lorentz.Polymorphic

type EDivOpResHs Natural Natural 
Instance details

Defined in Lorentz.Polymorphic

type EDivOpResHs Mutez Natural 
Instance details

Defined in Lorentz.Polymorphic

type ArithResHs Or Natural Natural 
Instance details

Defined in Lorentz.Arith

type ArithResHs Add Integer Natural 
Instance details

Defined in Lorentz.Arith

type ArithResHs Add Natural Integer 
Instance details

Defined in Lorentz.Arith

type ArithResHs Add Natural Natural 
Instance details

Defined in Lorentz.Arith

type ArithResHs Sub Integer Natural 
Instance details

Defined in Lorentz.Arith

type ArithResHs Sub Natural Integer 
Instance details

Defined in Lorentz.Arith

type ArithResHs Sub Natural Natural 
Instance details

Defined in Lorentz.Arith

type ArithResHs Mul Integer Natural 
Instance details

Defined in Lorentz.Arith

type ArithResHs Mul Natural Integer 
Instance details

Defined in Lorentz.Arith

type ArithResHs Mul Natural Natural 
Instance details

Defined in Lorentz.Arith

type ArithResHs Mul Natural Mutez 
Instance details

Defined in Lorentz.Arith

type ArithResHs Mul Mutez Natural 
Instance details

Defined in Lorentz.Arith

type ArithResHs And Integer Natural 
Instance details

Defined in Lorentz.Arith

type ArithResHs And Natural Natural 
Instance details

Defined in Lorentz.Arith

type ArithResHs Xor Natural Natural 
Instance details

Defined in Lorentz.Arith

type ArithResHs Lsl Natural Natural 
Instance details

Defined in Lorentz.Arith

type ArithResHs Lsr Natural Natural 
Instance details

Defined in Lorentz.Arith

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

Instances details
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 #

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 #

MonadFail Maybe

Since: base-4.9.0.0

Instance details

Defined in Control.Monad.Fail

Methods

fail :: String -> 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 #

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) #

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 #

MonadFailure Maybe 
Instance details

Defined in Basement.Monad

Associated Types

type Failure Maybe #

Methods

mFail :: Failure Maybe -> Maybe () #

NFData1 Maybe

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

liftRnf :: (a -> ()) -> Maybe a -> () #

MonadThrow Maybe 
Instance details

Defined in Control.Monad.Catch

Methods

throwM :: Exception e => e -> Maybe a #

Hashable1 Maybe 
Instance details

Defined in Data.Hashable.Class

Methods

liftHashWithSalt :: (Int -> a -> Int) -> Int -> Maybe a -> Int #

LorentzFunctor Maybe 
Instance details

Defined in Lorentz.Instr

Methods

lmap :: forall b a (s :: [Type]). KnownValue b => ((a ': s) :-> (b ': s)) -> (Maybe a ': s) :-> (Maybe b ': s) #

KnownNamedFunctor Maybe 
Instance details

Defined in Util.Named

Methods

namedL :: forall (name :: Symbol) a. Label name -> Iso' (NamedF Maybe a name) (ApplyNamedFunctor Maybe a) #

InjValue Maybe 
Instance details

Defined in Named.Internal

Methods

injValue :: a -> Maybe a #

PTraversable Maybe 
Instance details

Defined in Data.Singletons.Prelude.Traversable

Associated Types

type Traverse arg0 arg1 :: f0 (t0 b0) #

type SequenceA arg0 :: f0 (t0 a0) #

type MapM arg0 arg1 :: m0 (t0 b0) #

type Sequence arg0 :: m0 (t0 a0) #

STraversable Maybe 
Instance details

Defined in Data.Singletons.Prelude.Traversable

Methods

sTraverse :: forall a (f :: Type -> Type) b (t1 :: a ~> f b) (t2 :: Maybe a). SApplicative f => Sing t1 -> Sing t2 -> Sing (Apply (Apply TraverseSym0 t1) t2) #

sSequenceA :: forall (f :: Type -> Type) a (t :: Maybe (f a)). SApplicative f => Sing t -> Sing (Apply SequenceASym0 t) #

sMapM :: forall a (m :: Type -> Type) b (t1 :: a ~> m b) (t2 :: Maybe a). SMonad m => Sing t1 -> Sing t2 -> Sing (Apply (Apply MapMSym0 t1) t2) #

sSequence :: forall (m :: Type -> Type) a (t :: Maybe (m a)). SMonad m => Sing t -> Sing (Apply SequenceSym0 t) #

PFoldable Maybe 
Instance details

Defined in Data.Singletons.Prelude.Foldable

Associated Types

type Fold arg0 :: m0 #

type FoldMap arg0 arg1 :: m0 #

type Foldr arg0 arg1 arg2 :: b0 #

type Foldr' arg0 arg1 arg2 :: b0 #

type Foldl arg0 arg1 arg2 :: b0 #

type Foldl' arg0 arg1 arg2 :: b0 #

type Foldr1 arg0 arg1 :: a0 #

type Foldl1 arg0 arg1 :: a0 #

type ToList arg0 :: [a0] #

type Null arg0 :: Bool #

type Length arg0 :: Nat #

type Elem arg0 arg1 :: Bool #

type Maximum arg0 :: a0 #

type Minimum arg0 :: a0 #

type Sum arg0 :: a0 #

type Product arg0 :: a0 #

SFoldable Maybe 
Instance details

Defined in Data.Singletons.Prelude.Foldable

Methods

sFold :: forall m (t :: Maybe m). SMonoid m => Sing t -> Sing (Apply FoldSym0 t) #

sFoldMap :: forall a m (t1 :: a ~> m) (t2 :: Maybe a). SMonoid m => Sing t1 -> Sing t2 -> Sing (Apply (Apply FoldMapSym0 t1) t2) #

sFoldr :: forall a b (t1 :: a ~> (b ~> b)) (t2 :: b) (t3 :: Maybe a). Sing t1 -> Sing t2 -> Sing t3 -> Sing (Apply (Apply (Apply FoldrSym0 t1) t2) t3) #

sFoldr' :: forall a b (t1 :: a ~> (b ~> b)) (t2 :: b) (t3 :: Maybe a). Sing t1 -> Sing t2 -> Sing t3 -> Sing (Apply (Apply (Apply Foldr'Sym0 t1) t2) t3) #

sFoldl :: forall b a (t1 :: b ~> (a ~> b)) (t2 :: b) (t3 :: Maybe a). Sing t1 -> Sing t2 -> Sing t3 -> Sing (Apply (Apply (Apply FoldlSym0 t1) t2) t3) #

sFoldl' :: forall b a (t1 :: b ~> (a ~> b)) (t2 :: b) (t3 :: Maybe a). Sing t1 -> Sing t2 -> Sing t3 -> Sing (Apply (Apply (Apply Foldl'Sym0 t1) t2) t3) #

sFoldr1 :: forall a (t1 :: a ~> (a ~> a)) (t2 :: Maybe a). Sing t1 -> Sing t2 -> Sing (Apply (Apply Foldr1Sym0 t1) t2) #

sFoldl1 :: forall a (t1 :: a ~> (a ~> a)) (t2 :: Maybe a). Sing t1 -> Sing t2 -> Sing (Apply (Apply Foldl1Sym0 t1) t2) #

sToList :: forall a (t :: Maybe a). Sing t -> Sing (Apply ToListSym0 t) #

sNull :: forall a (t :: Maybe a). Sing t -> Sing (Apply NullSym0 t) #

sLength :: forall a (t :: Maybe a). Sing t -> Sing (Apply LengthSym0 t) #

sElem :: forall a (t1 :: a) (t2 :: Maybe a). SEq a => Sing t1 -> Sing t2 -> Sing (Apply (Apply ElemSym0 t1) t2) #

sMaximum :: forall a (t :: Maybe a). SOrd a => Sing t -> Sing (Apply MaximumSym0 t) #

sMinimum :: forall a (t :: Maybe a). SOrd a => Sing t -> Sing (Apply MinimumSym0 t) #

sSum :: forall a (t :: Maybe a). SNum a => Sing t -> Sing (Apply SumSym0 t) #

sProduct :: forall a (t :: Maybe a). SNum a => Sing t -> Sing (Apply ProductSym0 t) #

PMonadFail Maybe 
Instance details

Defined in Data.Singletons.Prelude.Monad.Fail

Associated Types

type Fail arg0 :: m0 a0 #

SMonadFail Maybe 
Instance details

Defined in Data.Singletons.Prelude.Monad.Fail

Methods

sFail :: forall a (t :: [Char]). Sing t -> Sing (Apply FailSym0 t) #

PFunctor Maybe 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

Associated Types

type Fmap arg0 arg1 :: f0 b0 #

type arg0 <$ arg1 :: f0 a0 #

PApplicative Maybe 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

Associated Types

type Pure arg0 :: f0 a0 #

type arg0 <*> arg1 :: f0 b0 #

type LiftA2 arg0 arg1 arg2 :: f0 c0 #

type arg0 *> arg1 :: f0 b0 #

type arg0 <* arg1 :: f0 a0 #

PMonad Maybe 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

Associated Types

type arg0 >>= arg1 :: m0 b0 #

type arg0 >> arg1 :: m0 b0 #

type Return arg0 :: m0 a0 #

PAlternative Maybe 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

Associated Types

type Empty :: f0 a0 #

type arg0 <|> arg1 :: f0 a0 #

PMonadPlus Maybe 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

Associated Types

type Mzero :: m0 a0 #

type Mplus arg0 arg1 :: m0 a0 #

SFunctor Maybe 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

Methods

sFmap :: forall a b (t1 :: a ~> b) (t2 :: Maybe a). Sing t1 -> Sing t2 -> Sing (Apply (Apply FmapSym0 t1) t2) #

(%<$) :: forall a b (t1 :: a) (t2 :: Maybe b). Sing t1 -> Sing t2 -> Sing (Apply (Apply (<$@#@$) t1) t2) #

SApplicative Maybe 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

Methods

sPure :: forall a (t :: a). Sing t -> Sing (Apply PureSym0 t) #

(%<*>) :: forall a b (t1 :: Maybe (a ~> b)) (t2 :: Maybe a). Sing t1 -> Sing t2 -> Sing (Apply (Apply (<*>@#@$) t1) t2) #

sLiftA2 :: forall a b c (t1 :: a ~> (b ~> c)) (t2 :: Maybe a) (t3 :: Maybe b). Sing t1 -> Sing t2 -> Sing t3 -> Sing (Apply (Apply (Apply LiftA2Sym0 t1) t2) t3) #

(%*>) :: forall a b (t1 :: Maybe a) (t2 :: Maybe b). Sing t1 -> Sing t2 -> Sing (Apply (Apply (*>@#@$) t1) t2) #

(%<*) :: forall a b (t1 :: Maybe a) (t2 :: Maybe b). Sing t1 -> Sing t2 -> Sing (Apply (Apply (<*@#@$) t1) t2) #

SMonad Maybe 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

Methods

(%>>=) :: forall a b (t1 :: Maybe a) (t2 :: a ~> Maybe b). Sing t1 -> Sing t2 -> Sing (Apply (Apply (>>=@#@$) t1) t2) #

(%>>) :: forall a b (t1 :: Maybe a) (t2 :: Maybe b). Sing t1 -> Sing t2 -> Sing (Apply (Apply (>>@#@$) t1) t2) #

sReturn :: forall a (t :: a). Sing t -> Sing (Apply ReturnSym0 t) #

SAlternative Maybe 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

Methods

sEmpty :: Sing EmptySym0 #

(%<|>) :: forall a (t1 :: Maybe a) (t2 :: Maybe a). 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 :: forall a (t1 :: Maybe a) (t2 :: Maybe a). Sing t1 -> Sing t2 -> Sing (Apply (Apply MplusSym0 t1) t2) #

MonadError () Maybe

Since: mtl-2.2.2

Instance details

Defined in Control.Monad.Error.Class

Methods

throwError :: () -> Maybe a #

catchError :: Maybe a -> (() -> Maybe a) -> Maybe a #

() :=> (Functor Maybe) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Functor Maybe #

() :=> (Applicative Maybe) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Applicative Maybe #

() :=> (Alternative Maybe) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Alternative Maybe #

() :=> (MonadPlus Maybe) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- MonadPlus Maybe #

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 #

Data a => Data (Maybe a)

Since: base-4.0.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Maybe a -> c (Maybe a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Maybe a) #

toConstr :: Maybe a -> Constr #

dataTypeOf :: Maybe a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Maybe a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Maybe a)) #

gmapT :: (forall b. Data b => b -> b) -> Maybe a -> Maybe a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Maybe a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Maybe a -> r #

gmapQ :: (forall d. Data d => d -> u) -> Maybe a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Maybe a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Maybe a -> m (Maybe a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Maybe a -> m (Maybe a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Maybe a -> m (Maybe a) #

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)

Since: base-4.6.0.0

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 #

Hashable a => Hashable (Maybe a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Maybe a -> Int #

hash :: Maybe a -> Int #

SingKind a => SingKind (Maybe a)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Associated Types

type DemoteRep (Maybe a)

Methods

fromSing :: forall (a0 :: Maybe a). Sing a0 -> DemoteRep (Maybe a)

NFData a => NFData (Maybe a) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Maybe a -> () #

Default (Maybe a) 
Instance details

Defined in Data.Default.Class

Methods

def :: Maybe a #

Ixed (Maybe a) 
Instance details

Defined in Control.Lens.At

Methods

ix :: Index (Maybe a) -> Traversal' (Maybe a) (IxValue (Maybe a)) #

At (Maybe a) 
Instance details

Defined in Control.Lens.At

Methods

at :: Index (Maybe a) -> Lens' (Maybe a) (Maybe (IxValue (Maybe a))) #

HasAnnotation a => HasAnnotation (Maybe a) 
Instance details

Defined in Lorentz.Annotation

Methods

getAnnotation :: Notes (ToT (Maybe a)) #

IsoValue a => IsoValue (Maybe a) 
Instance details

Defined in Michelson.Typed.Haskell.Value

Associated Types

type ToT (Maybe a) :: T #

Methods

toVal :: Maybe a -> Value (ToT (Maybe a)) #

fromVal :: Value (ToT (Maybe a)) -> Maybe a #

PolyTypeHasDocC '[a] => TypeHasDoc (Maybe a) 
Instance details

Defined in Michelson.Typed.Haskell.Doc

(TypeError (DisallowInstance "Maybe") :: Constraint) => Container (Maybe a) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element (Maybe a) #

Methods

toList :: Maybe a -> [Element (Maybe a)] #

null :: Maybe a -> Bool #

foldr :: (Element (Maybe a) -> b -> b) -> b -> Maybe a -> b #

foldl :: (b -> Element (Maybe a) -> b) -> b -> Maybe a -> b #

foldl' :: (b -> Element (Maybe a) -> b) -> b -> Maybe a -> b #

length :: Maybe a -> Int #

elem :: Element (Maybe a) -> Maybe a -> Bool #

maximum :: Maybe a -> Element (Maybe a) #

minimum :: Maybe a -> Element (Maybe a) #

foldMap :: Monoid m => (Element (Maybe a) -> m) -> Maybe a -> m #

fold :: Maybe a -> Element (Maybe a) #

foldr' :: (Element (Maybe a) -> b -> b) -> b -> Maybe a -> b #

foldr1 :: (Element (Maybe a) -> Element (Maybe a) -> Element (Maybe a)) -> Maybe a -> Element (Maybe a) #

foldl1 :: (Element (Maybe a) -> Element (Maybe a) -> Element (Maybe a)) -> Maybe a -> Element (Maybe a) #

notElem :: Element (Maybe a) -> Maybe a -> Bool #

all :: (Element (Maybe a) -> Bool) -> Maybe a -> Bool #

any :: (Element (Maybe a) -> Bool) -> Maybe a -> Bool #

and :: Maybe a -> Bool #

or :: Maybe a -> Bool #

find :: (Element (Maybe a) -> Bool) -> Maybe a -> Maybe (Element (Maybe a)) #

safeHead :: Maybe a -> Maybe (Element (Maybe a)) #

PMonoid (Maybe a) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

Associated Types

type Mempty :: a0 #

type Mappend arg0 arg1 :: a0 #

type Mconcat arg0 :: a0 #

SSemigroup a => SMonoid (Maybe a) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

Methods

sMempty :: Sing MemptySym0 #

sMappend :: forall (t1 :: Maybe a) (t2 :: Maybe a). Sing t1 -> Sing t2 -> Sing (Apply (Apply MappendSym0 t1) t2) #

sMconcat :: forall (t :: [Maybe a]). Sing t -> Sing (Apply MconcatSym0 t) #

PShow (Maybe a) 
Instance details

Defined in Data.Singletons.Prelude.Show

Associated Types

type ShowsPrec arg0 arg1 arg2 :: Symbol #

type Show_ arg0 :: Symbol #

type ShowList arg0 arg1 :: Symbol #

SShow a => SShow (Maybe a) 
Instance details

Defined in Data.Singletons.Prelude.Show

Methods

sShowsPrec :: forall (t1 :: Nat) (t2 :: Maybe a) (t3 :: Symbol). Sing t1 -> Sing t2 -> Sing t3 -> Sing (Apply (Apply (Apply ShowsPrecSym0 t1) t2) t3) #

sShow_ :: forall (t :: Maybe a). Sing t -> Sing (Apply Show_Sym0 t) #

sShowList :: forall (t1 :: [Maybe a]) (t2 :: Symbol). 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 arg0 <> arg1 :: a0 #

type Sconcat arg0 :: a0 #

SSemigroup a => SSemigroup (Maybe a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

Methods

(%<>) :: forall (t1 :: Maybe a) (t2 :: Maybe a). Sing t1 -> Sing t2 -> Sing (Apply (Apply (<>@#@$) t1) t2) #

sSconcat :: forall (t :: NonEmpty (Maybe a)). Sing t -> Sing (Apply SconcatSym0 t) #

POrd (Maybe a) 
Instance details

Defined in Data.Singletons.Prelude.Ord

Associated Types

type Compare arg0 arg1 :: Ordering #

type arg0 < arg1 :: Bool #

type arg0 <= arg1 :: Bool #

type arg0 > arg1 :: Bool #

type arg0 >= arg1 :: Bool #

type Max arg0 arg1 :: a0 #

type Min arg0 arg1 :: a0 #

SOrd a => SOrd (Maybe a) 
Instance details

Defined in Data.Singletons.Prelude.Ord

Methods

sCompare :: forall (t1 :: Maybe a) (t2 :: Maybe a). Sing t1 -> Sing t2 -> Sing (Apply (Apply CompareSym0 t1) t2) #

(%<) :: forall (t1 :: Maybe a) (t2 :: Maybe a). Sing t1 -> Sing t2 -> Sing (Apply (Apply (<@#@$) t1) t2) #

(%<=) :: forall (t1 :: Maybe a) (t2 :: Maybe a). Sing t1 -> Sing t2 -> Sing (Apply (Apply (<=@#@$) t1) t2) #

(%>) :: forall (t1 :: Maybe a) (t2 :: Maybe a). Sing t1 -> Sing t2 -> Sing (Apply (Apply (>@#@$) t1) t2) #

(%>=) :: forall (t1 :: Maybe a) (t2 :: Maybe a). Sing t1 -> Sing t2 -> Sing (Apply (Apply (>=@#@$) t1) t2) #

sMax :: forall (t1 :: Maybe a) (t2 :: Maybe a). Sing t1 -> Sing t2 -> Sing (Apply (Apply MaxSym0 t1) t2) #

sMin :: forall (t1 :: Maybe a) (t2 :: Maybe a). Sing t1 -> Sing t2 -> Sing (Apply (Apply MinSym0 t1) t2) #

SEq a => SEq (Maybe a) 
Instance details

Defined in Data.Singletons.Prelude.Eq

Methods

(%==) :: forall (a0 :: Maybe a) (b :: Maybe a). Sing a0 -> Sing b -> Sing (a0 == b) #

(%/=) :: forall (a0 :: Maybe a) (b :: Maybe a). 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 #

Generic1 Maybe

Since: base-4.6.0.0

Instance details

Defined in GHC.Generics

Associated Types

type Rep1 Maybe :: k -> Type #

Methods

from1 :: forall (a :: k). Maybe a -> Rep1 Maybe a #

to1 :: forall (a :: k). Rep1 Maybe a -> Maybe a #

IsoHKD Maybe (a :: Type) 
Instance details

Defined in Data.Vinyl.XRec

Associated Types

type HKD Maybe a #

Methods

unHKD :: HKD Maybe a -> Maybe a #

toHKD :: Maybe a -> HKD Maybe a #

SingI ('Nothing :: Maybe a)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

sing :: Sing 'Nothing

SDecide a => TestCoercion (SMaybe :: Maybe a -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Instances

Methods

testCoercion :: forall (a0 :: k) (b :: k). SMaybe a0 -> SMaybe b -> Maybe (Coercion a0 b) #

SDecide a => TestEquality (SMaybe :: Maybe a -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Instances

Methods

testEquality :: forall (a0 :: k) (b :: k). SMaybe a0 -> SMaybe b -> Maybe (a0 :~: b) #

(Eq a) :=> (Eq (Maybe a)) 
Instance details

Defined in Data.Constraint

Methods

ins :: Eq a :- Eq (Maybe a) #

(Ord a) :=> (Ord (Maybe a)) 
Instance details

Defined in Data.Constraint

Methods

ins :: Ord a :- Ord (Maybe a) #

(Read a) :=> (Read (Maybe a)) 
Instance details

Defined in Data.Constraint

Methods

ins :: Read a :- Read (Maybe a) #

(Show a) :=> (Show (Maybe a)) 
Instance details

Defined in Data.Constraint

Methods

ins :: Show a :- Show (Maybe a) #

(Semigroup a) :=> (Semigroup (Maybe a)) 
Instance details

Defined in Data.Constraint

Methods

ins :: Semigroup a :- Semigroup (Maybe a) #

(Monoid a) :=> (Monoid (Maybe a)) 
Instance details

Defined in Data.Constraint

Methods

ins :: Monoid a :- Monoid (Maybe a) #

Each (Maybe a) (Maybe b) a b 
Instance details

Defined in Lens.Micro.Internal

Methods

each :: Traversal (Maybe a) (Maybe b) a b #

CanCastTo a b => CanCastTo (Maybe a :: Type) (Maybe b :: Type) 
Instance details

Defined in Lorentz.Coercions

Methods

castDummy :: Proxy (Maybe a) -> Proxy (Maybe b) -> () #

SingI a2 => SingI ('Just a2 :: Maybe a1)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

sing :: Sing ('Just a2)

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 (CatMaybesSym0 :: TyFun [Maybe a6989586621679913394] [a6989586621679913394] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Maybe

SuppressUnusedWarnings (ListToMaybeSym0 :: TyFun [a6989586621679913395] (Maybe a6989586621679913395) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Maybe

SuppressUnusedWarnings (StripPrefixSym0 :: TyFun [a6989586621680438531] ([a6989586621680438531] ~> Maybe [a6989586621680438531]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (TFHelper_6989586621680024600Sym0 :: TyFun (Maybe a6989586621679962884) (Maybe a6989586621679962884 ~> Maybe a6989586621679962884) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

SuppressUnusedWarnings (MaybeToListSym0 :: TyFun (Maybe a6989586621679913396) [a6989586621679913396] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Maybe

SuppressUnusedWarnings (IsNothingSym0 :: TyFun (Maybe a6989586621679913399) Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Maybe

SuppressUnusedWarnings (IsJustSym0 :: TyFun (Maybe a6989586621679913400) Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Maybe

SuppressUnusedWarnings (FromJustSym0 :: TyFun (Maybe a6989586621679913398) a6989586621679913398 -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Maybe

SuppressUnusedWarnings (MinInternalSym0 :: TyFun (Maybe a6989586621680733526) (MinInternal a6989586621680733526) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (MaxInternalSym0 :: TyFun (Maybe a6989586621680732852) (MaxInternal a6989586621680732852) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (Compare_6989586621679803207Sym0 :: TyFun (Maybe a3530822107858468865) (Maybe a3530822107858468865 ~> Ordering) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

SuppressUnusedWarnings (OptionSym0 :: TyFun (Maybe a6989586621679060063) (Option a6989586621679060063) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (LastSym0 :: TyFun (Maybe a6989586621679087417) (Last a6989586621679087417) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

SuppressUnusedWarnings (FirstSym0 :: TyFun (Maybe a6989586621679087424) (First a6989586621679087424) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

SuppressUnusedWarnings (ShowsPrec_6989586621680595735Sym0 :: TyFun Nat (Maybe a3530822107858468865 ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (Pure_6989586621680024315Sym0 :: TyFun a6989586621679962808 (Maybe a6989586621679962808) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

SuppressUnusedWarnings (Let6989586621680024608LSym0 :: TyFun k1 (Maybe k1) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

SuppressUnusedWarnings (FromMaybeSym0 :: TyFun a6989586621679913397 (Maybe a6989586621679913397 ~> a6989586621679913397) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Maybe

SuppressUnusedWarnings (ElemIndexSym0 :: TyFun a6989586621680316349 ([a6989586621680316349] ~> 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 a6989586621679060063) (Maybe a6989586621679060063) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (GetFirstSym0 :: TyFun (First a6989586621679087424) (Maybe a6989586621679087424) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

SuppressUnusedWarnings (GetLastSym0 :: TyFun (Last a6989586621679087417) (Maybe a6989586621679087417) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

SuppressUnusedWarnings (FindSym0 :: TyFun (a6989586621680316350 ~> Bool) ([a6989586621680316350] ~> Maybe a6989586621680316350) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (FindIndexSym0 :: TyFun (a6989586621680316347 ~> Bool) ([a6989586621680316347] ~> Maybe Nat) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

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 #

SAlternative f => SingI (OptionalSym0 :: TyFun (f a) (f (Maybe a)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Applicative

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 (StripPrefixSym1 a6989586621680440227 :: TyFun [a6989586621680438531] (Maybe [a6989586621680438531]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (FindSym1 a6989586621680320898 :: TyFun [a6989586621680316350] (Maybe a6989586621680316350) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (FindIndexSym1 a6989586621680320874 :: TyFun [a6989586621680316347] (Maybe Nat) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (ElemIndexSym1 a6989586621680320890 :: TyFun [a6989586621680316349] (Maybe Nat) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (ShowsPrec_6989586621680595735Sym1 a6989586621680595732 a3530822107858468865 :: TyFun (Maybe a3530822107858468865) (Symbol ~> Symbol) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (TFHelper_6989586621680024600Sym1 a6989586621680024598 :: TyFun (Maybe a6989586621679962884) (Maybe a6989586621679962884) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

SuppressUnusedWarnings (TFHelper_6989586621680024510Sym0 :: TyFun (Maybe a6989586621679962834) (Maybe b6989586621679962835 ~> Maybe b6989586621679962835) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

SuppressUnusedWarnings (TFHelper_6989586621680024498Sym0 :: TyFun (Maybe a6989586621679962832) ((a6989586621679962832 ~> Maybe b6989586621679962833) ~> Maybe b6989586621679962833) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

SuppressUnusedWarnings (TFHelper_6989586621680024355Sym0 :: TyFun (Maybe a6989586621679962814) (Maybe b6989586621679962815 ~> Maybe b6989586621679962815) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

SuppressUnusedWarnings (FromMaybeSym1 a6989586621679913583 :: TyFun (Maybe a6989586621679913397) a6989586621679913397 -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Maybe

SuppressUnusedWarnings (Compare_6989586621679803207Sym1 a6989586621679803205 :: TyFun (Maybe a3530822107858468865) Ordering -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

SuppressUnusedWarnings (TFHelper_6989586621680024325Sym0 :: TyFun (Maybe (a6989586621679962809 ~> b6989586621679962810)) (Maybe a6989586621679962809 ~> Maybe b6989586621679962810) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

SuppressUnusedWarnings (TFHelper_6989586621680024177Sym0 :: TyFun a6989586621679962805 (Maybe b6989586621679962806 ~> Maybe a6989586621679962805) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

SuppressUnusedWarnings (Maybe_Sym0 :: TyFun b6989586621679911960 ((a6989586621679911961 ~> b6989586621679911960) ~> (Maybe a6989586621679911961 ~> b6989586621679911960)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Maybe

SuppressUnusedWarnings (LookupSym0 :: TyFun a6989586621680316328 ([(a6989586621680316328, b6989586621680316329)] ~> Maybe b6989586621680316329) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (Let6989586621680734313NSym0 :: TyFun k (TyFun k1 (Maybe k1) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (Let6989586621680734313MSym0 :: TyFun k1 (TyFun k (Maybe k1) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (Let6989586621680734286NSym0 :: TyFun k (TyFun k1 (Maybe k1) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (Let6989586621680734286MSym0 :: TyFun k1 (TyFun k (Maybe k1) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (OptionalSym0 :: TyFun (f6989586621681393521 a6989586621681393522) (f6989586621681393521 (Maybe a6989586621681393522)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Applicative

SuppressUnusedWarnings (Fmap_6989586621680024164Sym0 :: TyFun (a6989586621679962803 ~> b6989586621679962804) (Maybe a6989586621679962803 ~> Maybe b6989586621679962804) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

SuppressUnusedWarnings (MapMaybeSym0 :: TyFun (a6989586621679913392 ~> Maybe b6989586621679913393) ([a6989586621679913392] ~> [b6989586621679913393]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Maybe

SuppressUnusedWarnings (UnfoldrSym0 :: TyFun (b6989586621680316406 ~> Maybe (a6989586621680316407, b6989586621680316406)) (b6989586621680316406 ~> [a6989586621680316407]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (FindSym0 :: TyFun (a6989586621680742290 ~> Bool) (t6989586621680742289 a6989586621680742290 ~> Maybe a6989586621680742290) -> 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 (LookupSym1 a6989586621680320552 b6989586621680316329 :: TyFun [(a6989586621680316328, b6989586621680316329)] (Maybe b6989586621680316329) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (TFHelper_6989586621680024510Sym1 a6989586621680024508 b6989586621679962835 :: TyFun (Maybe b6989586621679962835) (Maybe b6989586621679962835) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

SuppressUnusedWarnings (TFHelper_6989586621680024355Sym1 a6989586621680024353 b6989586621679962815 :: TyFun (Maybe b6989586621679962815) (Maybe b6989586621679962815) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

SuppressUnusedWarnings (TFHelper_6989586621680024325Sym1 a6989586621680024323 :: TyFun (Maybe a6989586621679962809) (Maybe b6989586621679962810) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

SuppressUnusedWarnings (TFHelper_6989586621680024177Sym1 a6989586621680024175 b6989586621679962806 :: TyFun (Maybe b6989586621679962806) (Maybe a6989586621679962805) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

SuppressUnusedWarnings (Fmap_6989586621680024164Sym1 a6989586621680024162 :: TyFun (Maybe a6989586621679962803) (Maybe b6989586621679962804) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

SuppressUnusedWarnings (Let6989586621680734313NSym1 x6989586621680734311 :: TyFun k1 (Maybe k1) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (Let6989586621680734313MSym1 x6989586621680734311 :: TyFun k (Maybe k1) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (Let6989586621680734286NSym1 x6989586621680734284 :: TyFun k1 (Maybe k1) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (Let6989586621680734286MSym1 x6989586621680734284 :: TyFun k (Maybe k1) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (FindSym1 a6989586621680742743 t6989586621680742289 :: TyFun (t6989586621680742289 a6989586621680742290) (Maybe a6989586621680742290) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (Lambda_6989586621680641007Sym0 :: TyFun k (TyFun (k1 ~> Last a) (TyFun k1 (Maybe a) -> Type) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

SuppressUnusedWarnings (Lambda_6989586621680640919Sym0 :: TyFun k (TyFun (k1 ~> First a) (TyFun k1 (Maybe a) -> Type) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

SuppressUnusedWarnings (Traverse_6989586621680995058Sym0 :: TyFun (a6989586621680988964 ~> f6989586621680988963 b6989586621680988965) (Maybe a6989586621680988964 ~> f6989586621680988963 (Maybe b6989586621680988965)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

SuppressUnusedWarnings (TFHelper_6989586621680024498Sym1 a6989586621680024496 b6989586621679962833 :: TyFun (a6989586621679962832 ~> Maybe b6989586621679962833) (Maybe b6989586621679962833) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

SuppressUnusedWarnings (LiftA2_6989586621680024339Sym0 :: TyFun (a6989586621679962811 ~> (b6989586621679962812 ~> c6989586621679962813)) (Maybe a6989586621679962811 ~> (Maybe b6989586621679962812 ~> Maybe c6989586621679962813)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

SuppressUnusedWarnings (Maybe_Sym1 a6989586621679911978 a6989586621679911961 :: TyFun (a6989586621679911961 ~> b6989586621679911960) (Maybe a6989586621679911961 ~> b6989586621679911960) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Maybe

SuppressUnusedWarnings (Let6989586621679913560RsSym0 :: TyFun (a6989586621679913392 ~> Maybe k1) (TyFun k (TyFun [a6989586621679913392] [k1] -> Type) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Maybe

SuppressUnusedWarnings (Let6989586621680743224MfSym0 :: 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 (Let6989586621680743199MfSym0 :: TyFun (k2 ~> (k3 ~> k2)) (TyFun k (TyFun k2 (TyFun (Maybe k3) (Maybe k2) -> Type) -> Type) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

(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 (Traverse_6989586621680995058Sym1 a6989586621680995056 :: TyFun (Maybe a6989586621680988964) (f6989586621680988963 (Maybe b6989586621680988965)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

SuppressUnusedWarnings (LiftA2_6989586621680024339Sym1 a6989586621680024336 :: TyFun (Maybe a6989586621679962811) (Maybe b6989586621679962812 ~> Maybe c6989586621679962813) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

SuppressUnusedWarnings (Maybe_Sym2 a6989586621679911979 a6989586621679911978 :: TyFun (Maybe a6989586621679911961) b6989586621679911960 -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Maybe

SuppressUnusedWarnings (Let6989586621680743224MfSym1 f6989586621680743222 :: TyFun k (TyFun (Maybe k2) (TyFun k3 (Maybe k3) -> Type) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (Let6989586621680743199MfSym1 f6989586621680743197 :: TyFun k (TyFun k2 (TyFun (Maybe k3) (Maybe k2) -> Type) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (Lambda_6989586621680641007Sym1 a6989586621680641005 :: TyFun (k1 ~> Last a) (TyFun k1 (Maybe a) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

SuppressUnusedWarnings (Lambda_6989586621680640919Sym1 a6989586621680640917 :: TyFun (k1 ~> First a) (TyFun k1 (Maybe a) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

SuppressUnusedWarnings (LiftA2_6989586621680024339Sym2 a6989586621680024337 a6989586621680024336 :: TyFun (Maybe b6989586621679962812) (Maybe c6989586621679962813) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

SuppressUnusedWarnings (Let6989586621680743224MfSym2 xs6989586621680743223 f6989586621680743222 :: TyFun (Maybe k2) (TyFun k3 (Maybe k3) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (Let6989586621680743199MfSym2 xs6989586621680743198 f6989586621680743197 :: TyFun k2 (TyFun (Maybe k3) (Maybe k2) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (Lambda_6989586621680641007Sym2 k6989586621680641006 a6989586621680641005 :: TyFun k1 (Maybe a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

SuppressUnusedWarnings (Lambda_6989586621680640919Sym2 k6989586621680640918 a6989586621680640917 :: TyFun k1 (Maybe a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

SuppressUnusedWarnings (Let6989586621680743199MfSym3 a6989586621680743200 xs6989586621680743198 f6989586621680743197 :: TyFun (Maybe k3) (Maybe k2) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (Let6989586621680743224MfSym3 a6989586621680743225 xs6989586621680743223 f6989586621680743222 :: TyFun k3 (Maybe k3) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

Wrappable (NamedF Maybe a name) 
Instance details

Defined in Lorentz.Wrappable

Associated Types

type Unwrappable (NamedF Maybe a name) #

(HasAnnotation (Maybe a), KnownSymbol name) => HasAnnotation (NamedF Maybe a name) 
Instance details

Defined in Lorentz.Annotation

Methods

getAnnotation :: Notes (ToT (NamedF Maybe a name)) #

IsoValue a => IsoValue (NamedF Maybe a name) 
Instance details

Defined in Michelson.Typed.Haskell.Value

Associated Types

type ToT (NamedF Maybe a name) :: T #

Methods

toVal :: NamedF Maybe a name -> Value (ToT (NamedF Maybe a name)) #

fromVal :: Value (ToT (NamedF Maybe a name)) -> NamedF Maybe a name #

type Failure Maybe 
Instance details

Defined in Basement.Monad

type Failure Maybe = ()
type Empty 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type Empty = Empty_6989586621680024596Sym0 :: Maybe a
type Mzero 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type Mzero = Mzero_6989586621679963350Sym0 :: Maybe a0
type Product (arg0 :: Maybe a0) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Product (arg0 :: Maybe a0) = Apply (Product_6989586621680743347Sym0 :: TyFun (Maybe a0) a0 -> Type) arg0
type Sum (arg0 :: Maybe a0) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Sum (arg0 :: Maybe a0) = Apply (Sum_6989586621680743334Sym0 :: TyFun (Maybe a0) a0 -> Type) arg0
type Minimum (arg0 :: Maybe a0) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Minimum (arg0 :: Maybe a0) = Apply (Minimum_6989586621680743321Sym0 :: TyFun (Maybe a0) a0 -> Type) arg0
type Maximum (arg0 :: Maybe a0) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Maximum (arg0 :: Maybe a0) = Apply (Maximum_6989586621680743308Sym0 :: TyFun (Maybe a0) a0 -> Type) arg0
type Length (arg0 :: Maybe a0) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Length (arg0 :: Maybe a0) = Apply (Length_6989586621680743270Sym0 :: TyFun (Maybe a0) Nat -> Type) arg0
type Null (arg0 :: Maybe a0) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Null (arg0 :: Maybe a0) = Apply (Null_6989586621680743249Sym0 :: TyFun (Maybe a0) Bool -> Type) arg0
type ToList (arg0 :: Maybe a0) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type ToList (arg0 :: Maybe a0) = Apply (ToList_6989586621680743240Sym0 :: TyFun (Maybe a0) [a0] -> Type) arg0
type Fold (arg0 :: Maybe m0) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Fold (arg0 :: Maybe m0) = Apply (Fold_6989586621680743057Sym0 :: TyFun (Maybe m0) m0 -> Type) arg0
type Fail a2 
Instance details

Defined in Data.Singletons.Prelude.Monad.Fail

type Fail a2 = Apply (Fail_6989586621680104793Sym0 :: TyFun [Char] (Maybe a1) -> Type) a2
type Pure (a :: k1) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type Pure (a :: k1) = Apply (Pure_6989586621680024315Sym0 :: TyFun k1 (Maybe k1) -> Type) a
type Return (arg0 :: a0) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type Return (arg0 :: a0) = Apply (Return_6989586621679963334Sym0 :: TyFun a0 (Maybe a0) -> Type) arg0
type Sequence (arg0 :: Maybe (m0 a0)) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type Sequence (arg0 :: Maybe (m0 a0)) = Apply (Sequence_6989586621680989026Sym0 :: TyFun (Maybe (m0 a0)) (m0 (Maybe a0)) -> Type) arg0
type SequenceA (arg0 :: Maybe (f0 a0)) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type SequenceA (arg0 :: Maybe (f0 a0)) = Apply (SequenceA_6989586621680989001Sym0 :: TyFun (Maybe (f0 a0)) (f0 (Maybe a0)) -> Type) arg0
type Elem (arg1 :: a0) (arg2 :: Maybe a0) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Elem (arg1 :: a0) (arg2 :: Maybe a0) = Apply (Apply (Elem_6989586621680743293Sym0 :: TyFun a0 (Maybe a0 ~> Bool) -> Type) arg1) arg2
type Foldl1 (arg1 :: a0 ~> (a0 ~> a0)) (arg2 :: Maybe a0) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Foldl1 (arg1 :: a0 ~> (a0 ~> a0)) (arg2 :: Maybe a0) = Apply (Apply (Foldl1_6989586621680743216Sym0 :: TyFun (a0 ~> (a0 ~> a0)) (Maybe a0 ~> a0) -> Type) arg1) arg2
type Foldr1 (arg1 :: a0 ~> (a0 ~> a0)) (arg2 :: Maybe a0) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Foldr1 (arg1 :: a0 ~> (a0 ~> a0)) (arg2 :: Maybe a0) = Apply (Apply (Foldr1_6989586621680743191Sym0 :: TyFun (a0 ~> (a0 ~> a0)) (Maybe a0 ~> a0) -> Type) arg1) arg2
type (a1 :: Maybe a6989586621679962884) <|> (a2 :: Maybe a6989586621679962884) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type (a1 :: Maybe a6989586621679962884) <|> (a2 :: Maybe a6989586621679962884) = Apply (Apply (TFHelper_6989586621680024600Sym0 :: TyFun (Maybe a6989586621679962884) (Maybe a6989586621679962884 ~> Maybe a6989586621679962884) -> Type) a1) a2
type Mplus (arg1 :: Maybe a0) (arg2 :: Maybe a0) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type Mplus (arg1 :: Maybe a0) (arg2 :: Maybe a0) = Apply (Apply (Mplus_6989586621679963354Sym0 :: TyFun (Maybe a0) (Maybe a0 ~> Maybe a0) -> Type) arg1) arg2
type FoldMap (a1 :: a6989586621680742384 ~> k2) (a2 :: Maybe a6989586621680742384) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type FoldMap (a1 :: a6989586621680742384 ~> k2) (a2 :: Maybe a6989586621680742384) = Apply (Apply (FoldMap_6989586621680743361Sym0 :: TyFun (a6989586621680742384 ~> k2) (Maybe a6989586621680742384 ~> k2) -> Type) a1) a2
type (a1 :: k1) <$ (a2 :: Maybe b6989586621679962806) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type (a1 :: k1) <$ (a2 :: Maybe b6989586621679962806) = Apply (Apply (TFHelper_6989586621680024177Sym0 :: TyFun k1 (Maybe b6989586621679962806 ~> Maybe k1) -> Type) a1) a2
type Fmap (a1 :: a6989586621679962803 ~> b6989586621679962804) (a2 :: Maybe a6989586621679962803) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type Fmap (a1 :: a6989586621679962803 ~> b6989586621679962804) (a2 :: Maybe a6989586621679962803) = Apply (Apply (Fmap_6989586621680024164Sym0 :: TyFun (a6989586621679962803 ~> b6989586621679962804) (Maybe a6989586621679962803 ~> Maybe b6989586621679962804) -> Type) a1) a2
type (arg1 :: Maybe a0) <* (arg2 :: Maybe b0) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type (arg1 :: Maybe a0) <* (arg2 :: Maybe b0) = Apply (Apply (TFHelper_6989586621679963287Sym0 :: TyFun (Maybe a0) (Maybe b0 ~> Maybe a0) -> Type) arg1) arg2
type (a1 :: Maybe a6989586621679962814) *> (a2 :: Maybe b6989586621679962815) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type (a1 :: Maybe a6989586621679962814) *> (a2 :: Maybe b6989586621679962815) = Apply (Apply (TFHelper_6989586621680024355Sym0 :: TyFun (Maybe a6989586621679962814) (Maybe b6989586621679962815 ~> Maybe b6989586621679962815) -> Type) a1) a2
type (a1 :: Maybe (a6989586621679962809 ~> b6989586621679962810)) <*> (a2 :: Maybe a6989586621679962809) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type (a1 :: Maybe (a6989586621679962809 ~> b6989586621679962810)) <*> (a2 :: Maybe a6989586621679962809) = Apply (Apply (TFHelper_6989586621680024325Sym0 :: TyFun (Maybe (a6989586621679962809 ~> b6989586621679962810)) (Maybe a6989586621679962809 ~> Maybe b6989586621679962810) -> Type) a1) a2
type (a1 :: Maybe a6989586621679962834) >> (a2 :: Maybe b6989586621679962835) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type (a1 :: Maybe a6989586621679962834) >> (a2 :: Maybe b6989586621679962835) = Apply (Apply (TFHelper_6989586621680024510Sym0 :: TyFun (Maybe a6989586621679962834) (Maybe b6989586621679962835 ~> Maybe b6989586621679962835) -> Type) a1) a2
type (a1 :: Maybe a6989586621679962832) >>= (a2 :: a6989586621679962832 ~> Maybe b6989586621679962833) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type (a1 :: Maybe a6989586621679962832) >>= (a2 :: a6989586621679962832 ~> Maybe b6989586621679962833) = Apply (Apply (TFHelper_6989586621680024498Sym0 :: TyFun (Maybe a6989586621679962832) ((a6989586621679962832 ~> Maybe b6989586621679962833) ~> Maybe b6989586621679962833) -> Type) a1) a2
type MapM (arg1 :: a0 ~> m0 b0) (arg2 :: Maybe a0) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type MapM (arg1 :: a0 ~> m0 b0) (arg2 :: Maybe a0) = Apply (Apply (MapM_6989586621680989011Sym0 :: TyFun (a0 ~> m0 b0) (Maybe a0 ~> m0 (Maybe b0)) -> Type) arg1) arg2
type Traverse (a1 :: a6989586621680988964 ~> f6989586621680988963 b6989586621680988965) (a2 :: Maybe a6989586621680988964) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type Traverse (a1 :: a6989586621680988964 ~> f6989586621680988963 b6989586621680988965) (a2 :: Maybe a6989586621680988964) = Apply (Apply (Traverse_6989586621680995058Sym0 :: TyFun (a6989586621680988964 ~> f6989586621680988963 b6989586621680988965) (Maybe a6989586621680988964 ~> f6989586621680988963 (Maybe b6989586621680988965)) -> Type) a1) a2
type Foldl' (arg1 :: b0 ~> (a0 ~> b0)) (arg2 :: b0) (arg3 :: Maybe a0) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Foldl' (arg1 :: b0 ~> (a0 ~> b0)) (arg2 :: b0) (arg3 :: Maybe a0) = Apply (Apply (Apply (Foldl'_6989586621680743162Sym0 :: TyFun (b0 ~> (a0 ~> b0)) (b0 ~> (Maybe a0 ~> b0)) -> Type) arg1) arg2) arg3
type Foldl (a1 :: k2 ~> (a6989586621680742390 ~> k2)) (a2 :: k2) (a3 :: Maybe a6989586621680742390) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Foldl (a1 :: k2 ~> (a6989586621680742390 ~> k2)) (a2 :: k2) (a3 :: Maybe a6989586621680742390) = Apply (Apply (Apply (Foldl_6989586621680743396Sym0 :: TyFun (k2 ~> (a6989586621680742390 ~> k2)) (k2 ~> (Maybe a6989586621680742390 ~> k2)) -> Type) a1) a2) a3
type Foldr' (arg1 :: a0 ~> (b0 ~> b0)) (arg2 :: b0) (arg3 :: Maybe a0) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Foldr' (arg1 :: a0 ~> (b0 ~> b0)) (arg2 :: b0) (arg3 :: Maybe a0) = Apply (Apply (Apply (Foldr'_6989586621680743107Sym0 :: TyFun (a0 ~> (b0 ~> b0)) (b0 ~> (Maybe a0 ~> b0)) -> Type) arg1) arg2) arg3
type Foldr (a1 :: a6989586621680742385 ~> (k2 ~> k2)) (a2 :: k2) (a3 :: Maybe a6989586621680742385) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Foldr (a1 :: a6989586621680742385 ~> (k2 ~> k2)) (a2 :: k2) (a3 :: Maybe a6989586621680742385) = Apply (Apply (Apply (Foldr_6989586621680743378Sym0 :: TyFun (a6989586621680742385 ~> (k2 ~> k2)) (k2 ~> (Maybe a6989586621680742385 ~> k2)) -> Type) a1) a2) a3
type LiftA2 (a1 :: a6989586621679962811 ~> (b6989586621679962812 ~> c6989586621679962813)) (a2 :: Maybe a6989586621679962811) (a3 :: Maybe b6989586621679962812) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type LiftA2 (a1 :: a6989586621679962811 ~> (b6989586621679962812 ~> c6989586621679962813)) (a2 :: Maybe a6989586621679962811) (a3 :: Maybe b6989586621679962812) = Apply (Apply (Apply (LiftA2_6989586621680024339Sym0 :: TyFun (a6989586621679962811 ~> (b6989586621679962812 ~> c6989586621679962813)) (Maybe a6989586621679962811 ~> (Maybe b6989586621679962812 ~> Maybe c6989586621679962813)) -> Type) a1) a2) a3
type Apply (Pure_6989586621680024315Sym0 :: TyFun a (Maybe a) -> Type) (a6989586621680024314 :: a) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type Apply (Pure_6989586621680024315Sym0 :: TyFun a (Maybe a) -> Type) (a6989586621680024314 :: a) = Pure_6989586621680024315 a6989586621680024314
type Apply (Let6989586621680024608LSym0 :: TyFun k1 (Maybe k1) -> Type) (wild_69895866216800235866989586621680024607 :: k1) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type Apply (Let6989586621680024608LSym0 :: TyFun k1 (Maybe k1) -> Type) (wild_69895866216800235866989586621680024607 :: k1) = Let6989586621680024608L wild_69895866216800235866989586621680024607
type Apply (JustSym0 :: TyFun a (Maybe a) -> Type) (t6989586621679707039 :: a) 
Instance details

Defined in Data.Singletons.Prelude.Instances

type Apply (JustSym0 :: TyFun a (Maybe a) -> Type) (t6989586621679707039 :: a) = 'Just t6989586621679707039
type Apply (Let6989586621680734286NSym1 x6989586621680734284 :: TyFun k1 (Maybe k1) -> Type) (y6989586621680734285 :: k1) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Let6989586621680734286NSym1 x6989586621680734284 :: TyFun k1 (Maybe k1) -> Type) (y6989586621680734285 :: k1) = Let6989586621680734286N x6989586621680734284 y6989586621680734285
type Apply (Let6989586621680734286MSym1 x6989586621680734284 :: TyFun k (Maybe k1) -> Type) (y6989586621680734285 :: k) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Let6989586621680734286MSym1 x6989586621680734284 :: TyFun k (Maybe k1) -> Type) (y6989586621680734285 :: k) = Let6989586621680734286M x6989586621680734284 y6989586621680734285
type Apply (Let6989586621680734313NSym1 x6989586621680734311 :: TyFun k1 (Maybe k1) -> Type) (y6989586621680734312 :: k1) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Let6989586621680734313NSym1 x6989586621680734311 :: TyFun k1 (Maybe k1) -> Type) (y6989586621680734312 :: k1) = Let6989586621680734313N x6989586621680734311 y6989586621680734312
type Apply (Let6989586621680734313MSym1 x6989586621680734311 :: TyFun k (Maybe k1) -> Type) (y6989586621680734312 :: k) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Let6989586621680734313MSym1 x6989586621680734311 :: TyFun k (Maybe k1) -> Type) (y6989586621680734312 :: k) = Let6989586621680734313M x6989586621680734311 y6989586621680734312
type Apply (Lambda_6989586621680640919Sym2 k6989586621680640918 a6989586621680640917 :: TyFun k1 (Maybe a) -> Type) (t6989586621680640930 :: k1) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (Lambda_6989586621680640919Sym2 k6989586621680640918 a6989586621680640917 :: TyFun k1 (Maybe a) -> Type) (t6989586621680640930 :: k1) = Lambda_6989586621680640919 k6989586621680640918 a6989586621680640917 t6989586621680640930
type Apply (Lambda_6989586621680641007Sym2 k6989586621680641006 a6989586621680641005 :: TyFun k1 (Maybe a) -> Type) (t6989586621680641018 :: k1) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (Lambda_6989586621680641007Sym2 k6989586621680641006 a6989586621680641005 :: TyFun k1 (Maybe a) -> Type) (t6989586621680641018 :: k1) = Lambda_6989586621680641007 k6989586621680641006 a6989586621680641005 t6989586621680641018
type Apply (Let6989586621680743224MfSym3 a6989586621680743225 xs6989586621680743223 f6989586621680743222 :: TyFun k3 (Maybe k3) -> Type) (a6989586621680743226 :: k3) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Let6989586621680743224MfSym3 a6989586621680743225 xs6989586621680743223 f6989586621680743222 :: TyFun k3 (Maybe k3) -> Type) (a6989586621680743226 :: k3) = Let6989586621680743224Mf a6989586621680743225 xs6989586621680743223 f6989586621680743222 a6989586621680743226
type Apply (ShowsPrec_6989586621680595735Sym0 :: TyFun Nat (Maybe a3530822107858468865 ~> (Symbol ~> Symbol)) -> Type) (a6989586621680595732 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680595735Sym0 :: TyFun Nat (Maybe a3530822107858468865 ~> (Symbol ~> Symbol)) -> Type) (a6989586621680595732 :: Nat) = ShowsPrec_6989586621680595735Sym1 a6989586621680595732 a3530822107858468865 :: TyFun (Maybe a3530822107858468865) (Symbol ~> Symbol) -> Type
type Apply (FromMaybeSym0 :: TyFun a6989586621679913397 (Maybe a6989586621679913397 ~> a6989586621679913397) -> Type) (a6989586621679913583 :: a6989586621679913397) 
Instance details

Defined in Data.Singletons.Prelude.Maybe

type Apply (FromMaybeSym0 :: TyFun a6989586621679913397 (Maybe a6989586621679913397 ~> a6989586621679913397) -> Type) (a6989586621679913583 :: a6989586621679913397) = FromMaybeSym1 a6989586621679913583
type Apply (ElemIndexSym0 :: TyFun a6989586621680316349 ([a6989586621680316349] ~> Maybe Nat) -> Type) (a6989586621680320890 :: a6989586621680316349) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (ElemIndexSym0 :: TyFun a6989586621680316349 ([a6989586621680316349] ~> Maybe Nat) -> Type) (a6989586621680320890 :: a6989586621680316349) = ElemIndexSym1 a6989586621680320890
type Apply (TFHelper_6989586621680024177Sym0 :: TyFun a6989586621679962805 (Maybe b6989586621679962806 ~> Maybe a6989586621679962805) -> Type) (a6989586621680024175 :: a6989586621679962805) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type Apply (TFHelper_6989586621680024177Sym0 :: TyFun a6989586621679962805 (Maybe b6989586621679962806 ~> Maybe a6989586621679962805) -> Type) (a6989586621680024175 :: a6989586621679962805) = TFHelper_6989586621680024177Sym1 a6989586621680024175 b6989586621679962806 :: TyFun (Maybe b6989586621679962806) (Maybe a6989586621679962805) -> Type
type Apply (Maybe_Sym0 :: TyFun b6989586621679911960 ((a6989586621679911961 ~> b6989586621679911960) ~> (Maybe a6989586621679911961 ~> b6989586621679911960)) -> Type) (a6989586621679911978 :: b6989586621679911960) 
Instance details

Defined in Data.Singletons.Prelude.Maybe

type Apply (Maybe_Sym0 :: TyFun b6989586621679911960 ((a6989586621679911961 ~> b6989586621679911960) ~> (Maybe a6989586621679911961 ~> b6989586621679911960)) -> Type) (a6989586621679911978 :: b6989586621679911960) = Maybe_Sym1 a6989586621679911978 a6989586621679911961 :: TyFun (a6989586621679911961 ~> b6989586621679911960) (Maybe a6989586621679911961 ~> b6989586621679911960) -> Type
type Apply (LookupSym0 :: TyFun a6989586621680316328 ([(a6989586621680316328, b6989586621680316329)] ~> Maybe b6989586621680316329) -> Type) (a6989586621680320552 :: a6989586621680316328) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (LookupSym0 :: TyFun a6989586621680316328 ([(a6989586621680316328, b6989586621680316329)] ~> Maybe b6989586621680316329) -> Type) (a6989586621680320552 :: a6989586621680316328) = LookupSym1 a6989586621680320552 b6989586621680316329 :: TyFun [(a6989586621680316328, b6989586621680316329)] (Maybe b6989586621680316329) -> Type
type Apply (Let6989586621680734286NSym0 :: TyFun k (TyFun k1 (Maybe k1) -> Type) -> Type) (x6989586621680734284 :: k) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Let6989586621680734286NSym0 :: TyFun k (TyFun k1 (Maybe k1) -> Type) -> Type) (x6989586621680734284 :: k) = Let6989586621680734286NSym1 x6989586621680734284 :: TyFun k1 (Maybe k1) -> Type
type Apply (Let6989586621680734286MSym0 :: TyFun k1 (TyFun k (Maybe k1) -> Type) -> Type) (x6989586621680734284 :: k1) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Let6989586621680734286MSym0 :: TyFun k1 (TyFun k (Maybe k1) -> Type) -> Type) (x6989586621680734284 :: k1) = Let6989586621680734286MSym1 x6989586621680734284 :: TyFun k (Maybe k1) -> Type
type Apply (Let6989586621680734313NSym0 :: TyFun k (TyFun k1 (Maybe k1) -> Type) -> Type) (x6989586621680734311 :: k) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Let6989586621680734313NSym0 :: TyFun k (TyFun k1 (Maybe k1) -> Type) -> Type) (x6989586621680734311 :: k) = Let6989586621680734313NSym1 x6989586621680734311 :: TyFun k1 (Maybe k1) -> Type
type Apply (Let6989586621680734313MSym0 :: TyFun k1 (TyFun k (Maybe k1) -> Type) -> Type) (x6989586621680734311 :: k1) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Let6989586621680734313MSym0 :: TyFun k1 (TyFun k (Maybe k1) -> Type) -> Type) (x6989586621680734311 :: k1) = Let6989586621680734313MSym1 x6989586621680734311 :: TyFun k (Maybe k1) -> Type
type Apply (Lambda_6989586621680640919Sym0 :: TyFun k (TyFun (k1 ~> First a) (TyFun k1 (Maybe a) -> Type) -> Type) -> Type) (a6989586621680640917 :: k) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (Lambda_6989586621680640919Sym0 :: TyFun k (TyFun (k1 ~> First a) (TyFun k1 (Maybe a) -> Type) -> Type) -> Type) (a6989586621680640917 :: k) = Lambda_6989586621680640919Sym1 a6989586621680640917 :: TyFun (k1 ~> First a) (TyFun k1 (Maybe a) -> Type) -> Type
type Apply (Lambda_6989586621680641007Sym0 :: TyFun k (TyFun (k1 ~> Last a) (TyFun k1 (Maybe a) -> Type) -> Type) -> Type) (a6989586621680641005 :: k) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (Lambda_6989586621680641007Sym0 :: TyFun k (TyFun (k1 ~> Last a) (TyFun k1 (Maybe a) -> Type) -> Type) -> Type) (a6989586621680641005 :: k) = Lambda_6989586621680641007Sym1 a6989586621680641005 :: TyFun (k1 ~> Last a) (TyFun k1 (Maybe a) -> Type) -> Type
type Apply (Let6989586621680743199MfSym1 f6989586621680743197 :: TyFun k (TyFun k2 (TyFun (Maybe k3) (Maybe k2) -> Type) -> Type) -> Type) (xs6989586621680743198 :: k) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Let6989586621680743199MfSym1 f6989586621680743197 :: TyFun k (TyFun k2 (TyFun (Maybe k3) (Maybe k2) -> Type) -> Type) -> Type) (xs6989586621680743198 :: k) = Let6989586621680743199MfSym2 f6989586621680743197 xs6989586621680743198
type Apply (Let6989586621680743224MfSym1 f6989586621680743222 :: TyFun k (TyFun (Maybe k2) (TyFun k3 (Maybe k3) -> Type) -> Type) -> Type) (xs6989586621680743223 :: k) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Let6989586621680743224MfSym1 f6989586621680743222 :: TyFun k (TyFun (Maybe k2) (TyFun k3 (Maybe k3) -> Type) -> Type) -> Type) (xs6989586621680743223 :: k) = Let6989586621680743224MfSym2 f6989586621680743222 xs6989586621680743223
type Apply (Let6989586621680743199MfSym2 xs6989586621680743198 f6989586621680743197 :: TyFun k2 (TyFun (Maybe k3) (Maybe k2) -> Type) -> Type) (a6989586621680743200 :: k2) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Let6989586621680743199MfSym2 xs6989586621680743198 f6989586621680743197 :: TyFun k2 (TyFun (Maybe k3) (Maybe k2) -> Type) -> Type) (a6989586621680743200 :: k2) = Let6989586621680743199MfSym3 xs6989586621680743198 f6989586621680743197 a6989586621680743200
type Rep (Maybe a) 
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 Index (Maybe a) 
Instance details

Defined in Control.Lens.At

type Index (Maybe a) = ()
type IxValue (Maybe a) 
Instance details

Defined in Control.Lens.At

type IxValue (Maybe a) = a
type ToT (Maybe a) 
Instance details

Defined in Michelson.Typed.Haskell.Value

type ToT (Maybe a) = 'TOption (ToT a)
type TypeDocFieldDescriptions (Maybe a) 
Instance details

Defined in Michelson.Typed.Haskell.Doc

type Sing 
Instance details

Defined in Data.Singletons.Prelude.Instances

type Sing = SMaybe :: Maybe a -> Type
type Element (Maybe a) 
Instance details

Defined in Universum.Container.Class

type Element (Maybe a) = ElementDefault (Maybe a)
type Mempty 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Mempty = Mempty_6989586621680631384Sym0 :: Maybe a
type Demote (Maybe a) 
Instance details

Defined in Data.Singletons.Prelude.Instances

type Demote (Maybe a) = Maybe (Demote a)
type Rep1 Maybe 
Instance details

Defined in GHC.Generics

type Rep1 Maybe = 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) Par1))
type Mconcat (arg0 :: [Maybe a]) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Mconcat (arg0 :: [Maybe a]) = Apply (Mconcat_6989586621680631303Sym0 :: TyFun [Maybe a] (Maybe a) -> Type) arg0
type Show_ (arg0 :: Maybe a) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Show_ (arg0 :: Maybe a) = Apply (Show__6989586621680577846Sym0 :: TyFun (Maybe a) Symbol -> Type) arg0
type Sconcat (arg0 :: NonEmpty (Maybe a)) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Sconcat (arg0 :: NonEmpty (Maybe a)) = Apply (Sconcat_6989586621680187691Sym0 :: TyFun (NonEmpty (Maybe a)) (Maybe a) -> Type) arg0
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_6989586621680631288Sym0 :: 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_6989586621680577854Sym0 :: 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_6989586621680187922Sym0 :: 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_6989586621679792614Sym0 :: 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_6989586621679792596Sym0 :: 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_6989586621679792578Sym0 :: 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_6989586621679792560Sym0 :: 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_6989586621679792542Sym0 :: 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_6989586621679792524Sym0 :: 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_6989586621679803207Sym0 :: 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_6989586621679776054 a2 b
type HKD Maybe (a :: Type) 
Instance details

Defined in Data.Vinyl.XRec

type HKD Maybe (a :: Type) = Maybe a
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_6989586621680595735Sym0 :: TyFun Nat (Maybe a1 ~> (Symbol ~> Symbol)) -> Type) a2) a3) a4
type Apply (FromJustSym0 :: TyFun (Maybe a) a -> Type) (a6989586621679913593 :: Maybe a) 
Instance details

Defined in Data.Singletons.Prelude.Maybe

type Apply (FromJustSym0 :: TyFun (Maybe a) a -> Type) (a6989586621679913593 :: Maybe a) = FromJust a6989586621679913593
type Apply (IsNothingSym0 :: TyFun (Maybe a) Bool -> Type) (a6989586621679913596 :: Maybe a) 
Instance details

Defined in Data.Singletons.Prelude.Maybe

type Apply (IsNothingSym0 :: TyFun (Maybe a) Bool -> Type) (a6989586621679913596 :: Maybe a) = IsNothing a6989586621679913596
type Apply (IsJustSym0 :: TyFun (Maybe a) Bool -> Type) (a6989586621679913598 :: Maybe a) 
Instance details

Defined in Data.Singletons.Prelude.Maybe

type Apply (IsJustSym0 :: TyFun (Maybe a) Bool -> Type) (a6989586621679913598 :: Maybe a) = IsJust a6989586621679913598
type Apply (FromMaybeSym1 a6989586621679913583 :: TyFun (Maybe a) a -> Type) (a6989586621679913584 :: Maybe a) 
Instance details

Defined in Data.Singletons.Prelude.Maybe

type Apply (FromMaybeSym1 a6989586621679913583 :: TyFun (Maybe a) a -> Type) (a6989586621679913584 :: Maybe a) = FromMaybe a6989586621679913583 a6989586621679913584
type Apply (Compare_6989586621679803207Sym1 a6989586621679803205 :: TyFun (Maybe a) Ordering -> Type) (a6989586621679803206 :: Maybe a) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Apply (Compare_6989586621679803207Sym1 a6989586621679803205 :: TyFun (Maybe a) Ordering -> Type) (a6989586621679803206 :: Maybe a) = Compare_6989586621679803207 a6989586621679803205 a6989586621679803206
type Apply (Maybe_Sym2 a6989586621679911979 a6989586621679911978 :: TyFun (Maybe a) b -> Type) (a6989586621679911980 :: Maybe a) 
Instance details

Defined in Data.Singletons.Prelude.Maybe

type Apply (Maybe_Sym2 a6989586621679911979 a6989586621679911978 :: TyFun (Maybe a) b -> Type) (a6989586621679911980 :: Maybe a) = Maybe_ a6989586621679911979 a6989586621679911978 a6989586621679911980
type Apply (CatMaybesSym0 :: TyFun [Maybe a] [a] -> Type) (a6989586621679913572 :: [Maybe a]) 
Instance details

Defined in Data.Singletons.Prelude.Maybe

type Apply (CatMaybesSym0 :: TyFun [Maybe a] [a] -> Type) (a6989586621679913572 :: [Maybe a]) = CatMaybes a6989586621679913572
type Apply (ListToMaybeSym0 :: TyFun [a] (Maybe a) -> Type) (a6989586621679913577 :: [a]) 
Instance details

Defined in Data.Singletons.Prelude.Maybe

type Apply (ListToMaybeSym0 :: TyFun [a] (Maybe a) -> Type) (a6989586621679913577 :: [a]) = ListToMaybe a6989586621679913577
type Apply (MaybeToListSym0 :: TyFun (Maybe a) [a] -> Type) (a6989586621679913580 :: Maybe a) 
Instance details

Defined in Data.Singletons.Prelude.Maybe

type Apply (MaybeToListSym0 :: TyFun (Maybe a) [a] -> Type) (a6989586621679913580 :: Maybe a) = MaybeToList a6989586621679913580
type Apply (MaxInternalSym0 :: TyFun (Maybe a) (MaxInternal a) -> Type) (t6989586621680733515 :: Maybe a) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (MaxInternalSym0 :: TyFun (Maybe a) (MaxInternal a) -> Type) (t6989586621680733515 :: Maybe a) = 'MaxInternal t6989586621680733515
type Apply (MinInternalSym0 :: TyFun (Maybe a) (MinInternal a) -> Type) (t6989586621680733713 :: Maybe a) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (MinInternalSym0 :: TyFun (Maybe a) (MinInternal a) -> Type) (t6989586621680733713 :: Maybe a) = 'MinInternal t6989586621680733713
type Apply (OptionSym0 :: TyFun (Maybe a) (Option a) -> Type) (t6989586621680197015 :: Maybe a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (OptionSym0 :: TyFun (Maybe a) (Option a) -> Type) (t6989586621680197015 :: Maybe a) = 'Option t6989586621680197015
type Apply (FirstSym0 :: TyFun (Maybe a) (First a) -> Type) (t6989586621680634737 :: Maybe a) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (FirstSym0 :: TyFun (Maybe a) (First a) -> Type) (t6989586621680634737 :: Maybe a) = 'First t6989586621680634737
type Apply (LastSym0 :: TyFun (Maybe a) (Last a) -> Type) (t6989586621680634760 :: Maybe a) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (LastSym0 :: TyFun (Maybe a) (Last a) -> Type) (t6989586621680634760 :: Maybe a) = 'Last t6989586621680634760
type Apply (GetOptionSym0 :: TyFun (Option a) (Maybe a) -> Type) (a6989586621680197012 :: Option a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (GetOptionSym0 :: TyFun (Option a) (Maybe a) -> Type) (a6989586621680197012 :: Option a) = GetOption a6989586621680197012
type Apply (GetFirstSym0 :: TyFun (First a) (Maybe a) -> Type) (a6989586621680634734 :: First a) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (GetFirstSym0 :: TyFun (First a) (Maybe a) -> Type) (a6989586621680634734 :: First a) = GetFirst a6989586621680634734
type Apply (GetLastSym0 :: TyFun (Last a) (Maybe a) -> Type) (a6989586621680634757 :: Last a) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (GetLastSym0 :: TyFun (Last a) (Maybe a) -> Type) (a6989586621680634757 :: Last a) = GetLast a6989586621680634757
type Apply (FindSym1 a6989586621680320898 :: TyFun [a] (Maybe a) -> Type) (a6989586621680320899 :: [a]) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (FindSym1 a6989586621680320898 :: TyFun [a] (Maybe a) -> Type) (a6989586621680320899 :: [a]) = Find a6989586621680320898 a6989586621680320899
type Apply (FindIndexSym1 a6989586621680320874 :: TyFun [a] (Maybe Nat) -> Type) (a6989586621680320875 :: [a]) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (FindIndexSym1 a6989586621680320874 :: TyFun [a] (Maybe Nat) -> Type) (a6989586621680320875 :: [a]) = FindIndex a6989586621680320874 a6989586621680320875
type Apply (ElemIndexSym1 a6989586621680320890 :: TyFun [a] (Maybe Nat) -> Type) (a6989586621680320891 :: [a]) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (ElemIndexSym1 a6989586621680320890 :: TyFun [a] (Maybe Nat) -> Type) (a6989586621680320891 :: [a]) = ElemIndex a6989586621680320890 a6989586621680320891
type Apply (StripPrefixSym1 a6989586621680440227 :: TyFun [a] (Maybe [a]) -> Type) (a6989586621680440228 :: [a]) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (StripPrefixSym1 a6989586621680440227 :: TyFun [a] (Maybe [a]) -> Type) (a6989586621680440228 :: [a]) = StripPrefix a6989586621680440227 a6989586621680440228
type Apply (TFHelper_6989586621680024600Sym1 a6989586621680024598 :: TyFun (Maybe a) (Maybe a) -> Type) (a6989586621680024599 :: Maybe a) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type Apply (TFHelper_6989586621680024600Sym1 a6989586621680024598 :: TyFun (Maybe a) (Maybe a) -> Type) (a6989586621680024599 :: Maybe a) = TFHelper_6989586621680024600 a6989586621680024598 a6989586621680024599
type Apply (OptionalSym0 :: TyFun (f a) (f (Maybe a)) -> Type) (a6989586621681393559 :: f a) 
Instance details

Defined in Data.Singletons.Prelude.Applicative

type Apply (OptionalSym0 :: TyFun (f a) (f (Maybe a)) -> Type) (a6989586621681393559 :: f a) = Optional a6989586621681393559
type Apply (LookupSym1 a6989586621680320552 b :: TyFun [(a, b)] (Maybe b) -> Type) (a6989586621680320553 :: [(a, b)]) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (LookupSym1 a6989586621680320552 b :: TyFun [(a, b)] (Maybe b) -> Type) (a6989586621680320553 :: [(a, b)]) = Lookup a6989586621680320552 a6989586621680320553
type Apply (Fmap_6989586621680024164Sym1 a6989586621680024162 :: TyFun (Maybe a) (Maybe b) -> Type) (a6989586621680024163 :: Maybe a) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type Apply (Fmap_6989586621680024164Sym1 a6989586621680024162 :: TyFun (Maybe a) (Maybe b) -> Type) (a6989586621680024163 :: Maybe a) = Fmap_6989586621680024164 a6989586621680024162 a6989586621680024163
type Apply (TFHelper_6989586621680024177Sym1 a6989586621680024175 b :: TyFun (Maybe b) (Maybe a) -> Type) (a6989586621680024176 :: Maybe b) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type Apply (TFHelper_6989586621680024177Sym1 a6989586621680024175 b :: TyFun (Maybe b) (Maybe a) -> Type) (a6989586621680024176 :: Maybe b) = TFHelper_6989586621680024177 a6989586621680024175 a6989586621680024176
type Apply (TFHelper_6989586621680024325Sym1 a6989586621680024323 :: TyFun (Maybe a) (Maybe b) -> Type) (a6989586621680024324 :: Maybe a) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type Apply (TFHelper_6989586621680024325Sym1 a6989586621680024323 :: TyFun (Maybe a) (Maybe b) -> Type) (a6989586621680024324 :: Maybe a) = TFHelper_6989586621680024325 a6989586621680024323 a6989586621680024324
type Apply (TFHelper_6989586621680024355Sym1 a6989586621680024353 b :: TyFun (Maybe b) (Maybe b) -> Type) (a6989586621680024354 :: Maybe b) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type Apply (TFHelper_6989586621680024355Sym1 a6989586621680024353 b :: TyFun (Maybe b) (Maybe b) -> Type) (a6989586621680024354 :: Maybe b) = TFHelper_6989586621680024355 a6989586621680024353 a6989586621680024354
type Apply (TFHelper_6989586621680024510Sym1 a6989586621680024508 b :: TyFun (Maybe b) (Maybe b) -> Type) (a6989586621680024509 :: Maybe b) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type Apply (TFHelper_6989586621680024510Sym1 a6989586621680024508 b :: TyFun (Maybe b) (Maybe b) -> Type) (a6989586621680024509 :: Maybe b) = TFHelper_6989586621680024510 a6989586621680024508 a6989586621680024509
type Apply (FindSym1 a6989586621680742743 t :: TyFun (t a) (Maybe a) -> Type) (a6989586621680742744 :: t a) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (FindSym1 a6989586621680742743 t :: TyFun (t a) (Maybe a) -> Type) (a6989586621680742744 :: t a) = Find a6989586621680742743 a6989586621680742744
type Apply (Traverse_6989586621680995058Sym1 a6989586621680995056 :: TyFun (Maybe a) (f (Maybe b)) -> Type) (a6989586621680995057 :: Maybe a) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type Apply (Traverse_6989586621680995058Sym1 a6989586621680995056 :: TyFun (Maybe a) (f (Maybe b)) -> Type) (a6989586621680995057 :: Maybe a) = Traverse_6989586621680995058 a6989586621680995056 a6989586621680995057
type Apply (LiftA2_6989586621680024339Sym2 a6989586621680024337 a6989586621680024336 :: TyFun (Maybe b) (Maybe c) -> Type) (a6989586621680024338 :: Maybe b) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type Apply (LiftA2_6989586621680024339Sym2 a6989586621680024337 a6989586621680024336 :: TyFun (Maybe b) (Maybe c) -> Type) (a6989586621680024338 :: Maybe b) = LiftA2_6989586621680024339 a6989586621680024337 a6989586621680024336 a6989586621680024338
type Apply (Let6989586621680743199MfSym3 a6989586621680743200 xs6989586621680743198 f6989586621680743197 :: TyFun (Maybe k3) (Maybe k2) -> Type) (a6989586621680743201 :: Maybe k3) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Let6989586621680743199MfSym3 a6989586621680743200 xs6989586621680743198 f6989586621680743197 :: TyFun (Maybe k3) (Maybe k2) -> Type) (a6989586621680743201 :: Maybe k3) = Let6989586621680743199Mf a6989586621680743200 xs6989586621680743198 f6989586621680743197 a6989586621680743201
type Eval (Init (a2 ': (b ': as)) :: Maybe [a1] -> Type) 
Instance details

Defined in Fcf.Data.List

type Eval (Init (a2 ': (b ': as)) :: Maybe [a1] -> Type) = Eval ((Map (Cons a2) :: Maybe [a1] -> Maybe [a1] -> Type) =<< Init (b ': as))
type Eval (Init '[a2] :: Maybe [a1] -> Type) 
Instance details

Defined in Fcf.Data.List

type Eval (Init '[a2] :: Maybe [a1] -> Type) = 'Just ('[] :: [a1])
type Eval (Init ('[] :: [a]) :: Maybe [a] -> Type) 
Instance details

Defined in Fcf.Data.List

type Eval (Init ('[] :: [a]) :: Maybe [a] -> Type) = 'Nothing :: Maybe [a]
type Eval (Tail (_a ': as) :: Maybe [a] -> Type) 
Instance details

Defined in Fcf.Data.List

type Eval (Tail (_a ': as) :: Maybe [a] -> Type) = 'Just as
type Eval (Tail ('[] :: [a]) :: Maybe [a] -> Type) 
Instance details

Defined in Fcf.Data.List

type Eval (Tail ('[] :: [a]) :: Maybe [a] -> Type) = 'Nothing :: Maybe [a]
type Eval (Head (a2 ': _as) :: Maybe a1 -> Type) 
Instance details

Defined in Fcf.Data.List

type Eval (Head (a2 ': _as) :: Maybe a1 -> Type) = 'Just a2
type Eval (Head ('[] :: [a]) :: Maybe a -> Type) 
Instance details

Defined in Fcf.Data.List

type Eval (Head ('[] :: [a]) :: Maybe a -> Type) = 'Nothing :: Maybe a
type Eval (Last (a2 ': (b ': as)) :: Maybe a1 -> Type) 
Instance details

Defined in Fcf.Data.List

type Eval (Last (a2 ': (b ': as)) :: Maybe a1 -> Type) = Eval (Last (b ': as))
type Eval (Last '[a2] :: Maybe a1 -> Type) 
Instance details

Defined in Fcf.Data.List

type Eval (Last '[a2] :: Maybe a1 -> Type) = 'Just a2
type Eval (Last ('[] :: [a]) :: Maybe a -> Type) 
Instance details

Defined in Fcf.Data.List

type Eval (Last ('[] :: [a]) :: Maybe a -> Type) = 'Nothing :: Maybe a
type Apply (StripPrefixSym0 :: TyFun [a6989586621680438531] ([a6989586621680438531] ~> Maybe [a6989586621680438531]) -> Type) (a6989586621680440227 :: [a6989586621680438531]) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (StripPrefixSym0 :: TyFun [a6989586621680438531] ([a6989586621680438531] ~> Maybe [a6989586621680438531]) -> Type) (a6989586621680440227 :: [a6989586621680438531]) = StripPrefixSym1 a6989586621680440227
type Apply (TFHelper_6989586621680024600Sym0 :: TyFun (Maybe a6989586621679962884) (Maybe a6989586621679962884 ~> Maybe a6989586621679962884) -> Type) (a6989586621680024598 :: Maybe a6989586621679962884) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type Apply (TFHelper_6989586621680024600Sym0 :: TyFun (Maybe a6989586621679962884) (Maybe a6989586621679962884 ~> Maybe a6989586621679962884) -> Type) (a6989586621680024598 :: Maybe a6989586621679962884) = TFHelper_6989586621680024600Sym1 a6989586621680024598
type Apply (Compare_6989586621679803207Sym0 :: TyFun (Maybe a3530822107858468865) (Maybe a3530822107858468865 ~> Ordering) -> Type) (a6989586621679803205 :: Maybe a3530822107858468865) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Apply (Compare_6989586621679803207Sym0 :: TyFun (Maybe a3530822107858468865) (Maybe a3530822107858468865 ~> Ordering) -> Type) (a6989586621679803205 :: Maybe a3530822107858468865) = Compare_6989586621679803207Sym1 a6989586621679803205
type Apply (ShowsPrec_6989586621680595735Sym1 a6989586621680595732 a3530822107858468865 :: TyFun (Maybe a3530822107858468865) (Symbol ~> Symbol) -> Type) (a6989586621680595733 :: Maybe a3530822107858468865) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680595735Sym1 a6989586621680595732 a3530822107858468865 :: TyFun (Maybe a3530822107858468865) (Symbol ~> Symbol) -> Type) (a6989586621680595733 :: Maybe a3530822107858468865) = ShowsPrec_6989586621680595735Sym2 a6989586621680595732 a6989586621680595733
type Apply (TFHelper_6989586621680024355Sym0 :: TyFun (Maybe a6989586621679962814) (Maybe b6989586621679962815 ~> Maybe b6989586621679962815) -> Type) (a6989586621680024353 :: Maybe a6989586621679962814) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type Apply (TFHelper_6989586621680024355Sym0 :: TyFun (Maybe a6989586621679962814) (Maybe b6989586621679962815 ~> Maybe b6989586621679962815) -> Type) (a6989586621680024353 :: Maybe a6989586621679962814) = TFHelper_6989586621680024355Sym1 a6989586621680024353 b6989586621679962815 :: TyFun (Maybe b6989586621679962815) (Maybe b6989586621679962815) -> Type
type Apply (TFHelper_6989586621680024498Sym0 :: TyFun (Maybe a6989586621679962832) ((a6989586621679962832 ~> Maybe b6989586621679962833) ~> Maybe b6989586621679962833) -> Type) (a6989586621680024496 :: Maybe a6989586621679962832) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type Apply (TFHelper_6989586621680024498Sym0 :: TyFun (Maybe a6989586621679962832) ((a6989586621679962832 ~> Maybe b6989586621679962833) ~> Maybe b6989586621679962833) -> Type) (a6989586621680024496 :: Maybe a6989586621679962832) = TFHelper_6989586621680024498Sym1 a6989586621680024496 b6989586621679962833 :: TyFun (a6989586621679962832 ~> Maybe b6989586621679962833) (Maybe b6989586621679962833) -> Type
type Apply (TFHelper_6989586621680024510Sym0 :: TyFun (Maybe a6989586621679962834) (Maybe b6989586621679962835 ~> Maybe b6989586621679962835) -> Type) (a6989586621680024508 :: Maybe a6989586621679962834) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type Apply (TFHelper_6989586621680024510Sym0 :: TyFun (Maybe a6989586621679962834) (Maybe b6989586621679962835 ~> Maybe b6989586621679962835) -> Type) (a6989586621680024508 :: Maybe a6989586621679962834) = TFHelper_6989586621680024510Sym1 a6989586621680024508 b6989586621679962835 :: TyFun (Maybe b6989586621679962835) (Maybe b6989586621679962835) -> Type
type Apply (TFHelper_6989586621680024325Sym0 :: TyFun (Maybe (a6989586621679962809 ~> b6989586621679962810)) (Maybe a6989586621679962809 ~> Maybe b6989586621679962810) -> Type) (a6989586621680024323 :: Maybe (a6989586621679962809 ~> b6989586621679962810)) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type Apply (TFHelper_6989586621680024325Sym0 :: TyFun (Maybe (a6989586621679962809 ~> b6989586621679962810)) (Maybe a6989586621679962809 ~> Maybe b6989586621679962810) -> Type) (a6989586621680024323 :: Maybe (a6989586621679962809 ~> b6989586621679962810)) = TFHelper_6989586621680024325Sym1 a6989586621680024323
type Apply (LiftA2_6989586621680024339Sym1 a6989586621680024336 :: TyFun (Maybe a6989586621679962811) (Maybe b6989586621679962812 ~> Maybe c6989586621679962813) -> Type) (a6989586621680024337 :: Maybe a6989586621679962811) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type Apply (LiftA2_6989586621680024339Sym1 a6989586621680024336 :: TyFun (Maybe a6989586621679962811) (Maybe b6989586621679962812 ~> Maybe c6989586621679962813) -> Type) (a6989586621680024337 :: Maybe a6989586621679962811) = LiftA2_6989586621680024339Sym2 a6989586621680024336 a6989586621680024337
type Apply (Let6989586621680743224MfSym2 xs6989586621680743223 f6989586621680743222 :: TyFun (Maybe k2) (TyFun k3 (Maybe k3) -> Type) -> Type) (a6989586621680743225 :: Maybe k2) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Let6989586621680743224MfSym2 xs6989586621680743223 f6989586621680743222 :: TyFun (Maybe k2) (TyFun k3 (Maybe k3) -> Type) -> Type) (a6989586621680743225 :: Maybe k2) = Let6989586621680743224MfSym3 xs6989586621680743223 f6989586621680743222 a6989586621680743225
type Eval (FindIndex p (a2 ': as) :: Maybe Nat -> Type) 
Instance details

Defined in Fcf.Data.List

type Eval (FindIndex p (a2 ': as) :: Maybe Nat -> Type) = Eval (If (Eval (p a2)) (Pure ('Just 0)) ((Map ((+) 1) :: Maybe Nat -> Maybe Nat -> Type) =<< FindIndex p as))
type Eval (FindIndex _p ('[] :: [a]) :: Maybe Nat -> Type) 
Instance details

Defined in Fcf.Data.List

type Eval (FindIndex _p ('[] :: [a]) :: Maybe Nat -> Type) = 'Nothing :: Maybe Nat
type Eval (NumIter a s :: Maybe (k, Nat) -> Type) 
Instance details

Defined in Fcf.Data.List

type Eval (NumIter a s :: Maybe (k, Nat) -> Type) = If (Eval (s > 0)) ('Just '(a, s - 1)) ('Nothing :: Maybe (k, Nat))
type Eval (Find p (a2 ': as) :: Maybe a1 -> Type) 
Instance details

Defined in Fcf.Data.List

type Eval (Find p (a2 ': as) :: Maybe a1 -> Type) = Eval (If (Eval (p a2)) (Pure ('Just a2)) (Find p as))
type Eval (Find _p ('[] :: [a]) :: Maybe a -> Type) 
Instance details

Defined in Fcf.Data.List

type Eval (Find _p ('[] :: [a]) :: Maybe a -> Type) = 'Nothing :: Maybe a
type Eval (Lookup a as :: Maybe b -> Type) 
Instance details

Defined in Fcf.Data.List

type Eval (Lookup a as :: Maybe b -> Type) = Eval (Map (Snd :: (k, b) -> b -> Type) (Eval (Find ((TyEq a :: k -> Bool -> Type) <=< (Fst :: (k, b) -> k -> Type)) as)))
type Eval (Map f ('Just a3) :: Maybe a2 -> Type) 
Instance details

Defined in Fcf.Classes

type Eval (Map f ('Just a3) :: Maybe a2 -> Type) = 'Just (Eval (f a3))
type Eval (Map f ('Nothing :: Maybe a) :: Maybe b -> Type) 
Instance details

Defined in Fcf.Classes

type Eval (Map f ('Nothing :: Maybe a) :: Maybe b -> Type) = 'Nothing :: Maybe b
type Eval ('Just x <|> _1 :: Maybe a -> Type) 
Instance details

Defined in Util.Fcf

type Eval ('Just x <|> _1 :: Maybe a -> Type) = 'Just x
type Eval (('Nothing :: Maybe a) <|> m :: Maybe a -> Type) 
Instance details

Defined in Util.Fcf

type Eval (('Nothing :: Maybe a) <|> m :: Maybe a -> Type) = m
type Apply (TFHelper_6989586621680024498Sym1 a6989586621680024496 b :: TyFun (a ~> Maybe b) (Maybe b) -> Type) (a6989586621680024497 :: a ~> Maybe b) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type Apply (TFHelper_6989586621680024498Sym1 a6989586621680024496 b :: TyFun (a ~> Maybe b) (Maybe b) -> Type) (a6989586621680024497 :: a ~> Maybe b) = TFHelper_6989586621680024498 a6989586621680024496 a6989586621680024497
type Apply (FindSym0 :: TyFun (a6989586621680316350 ~> Bool) ([a6989586621680316350] ~> Maybe a6989586621680316350) -> Type) (a6989586621680320898 :: a6989586621680316350 ~> Bool) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (FindSym0 :: TyFun (a6989586621680316350 ~> Bool) ([a6989586621680316350] ~> Maybe a6989586621680316350) -> Type) (a6989586621680320898 :: a6989586621680316350 ~> Bool) = FindSym1 a6989586621680320898
type Apply (FindIndexSym0 :: TyFun (a6989586621680316347 ~> Bool) ([a6989586621680316347] ~> Maybe Nat) -> Type) (a6989586621680320874 :: a6989586621680316347 ~> Bool) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (FindIndexSym0 :: TyFun (a6989586621680316347 ~> Bool) ([a6989586621680316347] ~> Maybe Nat) -> Type) (a6989586621680320874 :: a6989586621680316347 ~> Bool) = FindIndexSym1 a6989586621680320874
type Apply (Fmap_6989586621680024164Sym0 :: TyFun (a6989586621679962803 ~> b6989586621679962804) (Maybe a6989586621679962803 ~> Maybe b6989586621679962804) -> Type) (a6989586621680024162 :: a6989586621679962803 ~> b6989586621679962804) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type Apply (Fmap_6989586621680024164Sym0 :: TyFun (a6989586621679962803 ~> b6989586621679962804) (Maybe a6989586621679962803 ~> Maybe b6989586621679962804) -> Type) (a6989586621680024162 :: a6989586621679962803 ~> b6989586621679962804) = Fmap_6989586621680024164Sym1 a6989586621680024162
type Apply (MapMaybeSym0 :: TyFun (a6989586621679913392 ~> Maybe b6989586621679913393) ([a6989586621679913392] ~> [b6989586621679913393]) -> Type) (a6989586621679913553 :: a6989586621679913392 ~> Maybe b6989586621679913393) 
Instance details

Defined in Data.Singletons.Prelude.Maybe

type Apply (MapMaybeSym0 :: TyFun (a6989586621679913392 ~> Maybe b6989586621679913393) ([a6989586621679913392] ~> [b6989586621679913393]) -> Type) (a6989586621679913553 :: a6989586621679913392 ~> Maybe b6989586621679913393) = MapMaybeSym1 a6989586621679913553
type Apply (UnfoldrSym0 :: TyFun (b6989586621680316406 ~> Maybe (a6989586621680316407, b6989586621680316406)) (b6989586621680316406 ~> [a6989586621680316407]) -> Type) (a6989586621680321318 :: b6989586621680316406 ~> Maybe (a6989586621680316407, b6989586621680316406)) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (UnfoldrSym0 :: TyFun (b6989586621680316406 ~> Maybe (a6989586621680316407, b6989586621680316406)) (b6989586621680316406 ~> [a6989586621680316407]) -> Type) (a6989586621680321318 :: b6989586621680316406 ~> Maybe (a6989586621680316407, b6989586621680316406)) = UnfoldrSym1 a6989586621680321318
type Apply (FindSym0 :: TyFun (a6989586621680742290 ~> Bool) (t6989586621680742289 a6989586621680742290 ~> Maybe a6989586621680742290) -> Type) (a6989586621680742743 :: a6989586621680742290 ~> Bool) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (FindSym0 :: TyFun (a6989586621680742290 ~> Bool) (t6989586621680742289 a6989586621680742290 ~> Maybe a6989586621680742290) -> Type) (a6989586621680742743 :: a6989586621680742290 ~> Bool) = FindSym1 a6989586621680742743 t6989586621680742289 :: TyFun (t6989586621680742289 a6989586621680742290) (Maybe a6989586621680742290) -> Type
type Apply (Traverse_6989586621680995058Sym0 :: TyFun (a6989586621680988964 ~> f6989586621680988963 b6989586621680988965) (Maybe a6989586621680988964 ~> f6989586621680988963 (Maybe b6989586621680988965)) -> Type) (a6989586621680995056 :: a6989586621680988964 ~> f6989586621680988963 b6989586621680988965) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type Apply (Traverse_6989586621680995058Sym0 :: TyFun (a6989586621680988964 ~> f6989586621680988963 b6989586621680988965) (Maybe a6989586621680988964 ~> f6989586621680988963 (Maybe b6989586621680988965)) -> Type) (a6989586621680995056 :: a6989586621680988964 ~> f6989586621680988963 b6989586621680988965) = Traverse_6989586621680995058Sym1 a6989586621680995056
type Apply (LiftA2_6989586621680024339Sym0 :: TyFun (a6989586621679962811 ~> (b6989586621679962812 ~> c6989586621679962813)) (Maybe a6989586621679962811 ~> (Maybe b6989586621679962812 ~> Maybe c6989586621679962813)) -> Type) (a6989586621680024336 :: a6989586621679962811 ~> (b6989586621679962812 ~> c6989586621679962813)) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type Apply (LiftA2_6989586621680024339Sym0 :: TyFun (a6989586621679962811 ~> (b6989586621679962812 ~> c6989586621679962813)) (Maybe a6989586621679962811 ~> (Maybe b6989586621679962812 ~> Maybe c6989586621679962813)) -> Type) (a6989586621680024336 :: a6989586621679962811 ~> (b6989586621679962812 ~> c6989586621679962813)) = LiftA2_6989586621680024339Sym1 a6989586621680024336
type Apply (Maybe_Sym1 a6989586621679911978 a6989586621679911961 :: TyFun (a6989586621679911961 ~> b6989586621679911960) (Maybe a6989586621679911961 ~> b6989586621679911960) -> Type) (a6989586621679911979 :: a6989586621679911961 ~> b6989586621679911960) 
Instance details

Defined in Data.Singletons.Prelude.Maybe

type Apply (Maybe_Sym1 a6989586621679911978 a6989586621679911961 :: TyFun (a6989586621679911961 ~> b6989586621679911960) (Maybe a6989586621679911961 ~> b6989586621679911960) -> Type) (a6989586621679911979 :: a6989586621679911961 ~> b6989586621679911960) = Maybe_Sym2 a6989586621679911978 a6989586621679911979
type Apply (Let6989586621679913560RsSym0 :: TyFun (a6989586621679913392 ~> Maybe k1) (TyFun k (TyFun [a6989586621679913392] [k1] -> Type) -> Type) -> Type) (f6989586621679913557 :: a6989586621679913392 ~> Maybe k1) 
Instance details

Defined in Data.Singletons.Prelude.Maybe

type Apply (Let6989586621679913560RsSym0 :: TyFun (a6989586621679913392 ~> Maybe k1) (TyFun k (TyFun [a6989586621679913392] [k1] -> Type) -> Type) -> Type) (f6989586621679913557 :: a6989586621679913392 ~> Maybe k1) = Let6989586621679913560RsSym1 f6989586621679913557 :: TyFun k (TyFun [a6989586621679913392] [k1] -> Type) -> Type
type Apply (Let6989586621680743199MfSym0 :: TyFun (k2 ~> (k3 ~> k2)) (TyFun k (TyFun k2 (TyFun (Maybe k3) (Maybe k2) -> Type) -> Type) -> Type) -> Type) (f6989586621680743197 :: k2 ~> (k3 ~> k2)) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Let6989586621680743199MfSym0 :: TyFun (k2 ~> (k3 ~> k2)) (TyFun k (TyFun k2 (TyFun (Maybe k3) (Maybe k2) -> Type) -> Type) -> Type) -> Type) (f6989586621680743197 :: k2 ~> (k3 ~> k2)) = Let6989586621680743199MfSym1 f6989586621680743197 :: TyFun k (TyFun k2 (TyFun (Maybe k3) (Maybe k2) -> Type) -> Type) -> Type
type Apply (Let6989586621680743224MfSym0 :: TyFun (k2 ~> (k3 ~> k3)) (TyFun k (TyFun (Maybe k2) (TyFun k3 (Maybe k3) -> Type) -> Type) -> Type) -> Type) (f6989586621680743222 :: k2 ~> (k3 ~> k3)) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Let6989586621680743224MfSym0 :: TyFun (k2 ~> (k3 ~> k3)) (TyFun k (TyFun (Maybe k2) (TyFun k3 (Maybe k3) -> Type) -> Type) -> Type) -> Type) (f6989586621680743222 :: k2 ~> (k3 ~> k3)) = Let6989586621680743224MfSym1 f6989586621680743222 :: TyFun k (TyFun (Maybe k2) (TyFun k3 (Maybe k3) -> Type) -> Type) -> Type
type Apply (Lambda_6989586621680640919Sym1 a6989586621680640917 :: TyFun (k1 ~> First a) (TyFun k1 (Maybe a) -> Type) -> Type) (k6989586621680640918 :: k1 ~> First a) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (Lambda_6989586621680640919Sym1 a6989586621680640917 :: TyFun (k1 ~> First a) (TyFun k1 (Maybe a) -> Type) -> Type) (k6989586621680640918 :: k1 ~> First a) = Lambda_6989586621680640919Sym2 a6989586621680640917 k6989586621680640918
type Apply (Lambda_6989586621680641007Sym1 a6989586621680641005 :: TyFun (k1 ~> Last a) (TyFun k1 (Maybe a) -> Type) -> Type) (k6989586621680641006 :: k1 ~> Last a) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (Lambda_6989586621680641007Sym1 a6989586621680641005 :: TyFun (k1 ~> Last a) (TyFun k1 (Maybe a) -> Type) -> Type) (k6989586621680641006 :: k1 ~> Last a) = Lambda_6989586621680641007Sym2 a6989586621680641005 k6989586621680641006
type Unwrappable (NamedF Maybe a name) 
Instance details

Defined in Lorentz.Wrappable

type Unwrappable (NamedF Maybe a name) = Maybe a
type ToT (NamedF Maybe a name) 
Instance details

Defined in Michelson.Typed.Haskell.Value

type ToT (NamedF Maybe a name) = ToT (Maybe a)

data Ordering #

Constructors

LT 
EQ 
GT 

Instances

Instances details
Bounded Ordering

Since: base-2.1

Instance details

Defined in GHC.Enum

Enum Ordering

Since: base-2.1

Instance details

Defined in GHC.Enum

Eq Ordering 
Instance details

Defined in GHC.Classes

Data Ordering

Since: base-4.0.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Ordering -> c Ordering #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Ordering #

toConstr :: Ordering -> Constr #

dataTypeOf :: Ordering -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Ordering) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Ordering) #

gmapT :: (forall b. Data b => b -> b) -> Ordering -> Ordering #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Ordering -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Ordering -> r #

gmapQ :: (forall d. Data d => d -> u) -> Ordering -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Ordering -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Ordering -> m Ordering #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Ordering -> m Ordering #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Ordering -> m Ordering #

Ord Ordering 
Instance details

Defined in GHC.Classes

Read Ordering

Since: base-2.1

Instance details

Defined in GHC.Read

Show Ordering

Since: base-2.1

Instance details

Defined in GHC.Show

Generic Ordering

Since: base-4.6.0.0

Instance details

Defined in GHC.Generics

Associated Types

type Rep Ordering :: Type -> Type #

Methods

from :: Ordering -> Rep Ordering x #

to :: Rep Ordering x -> Ordering #

Semigroup Ordering

Since: base-4.9.0.0

Instance details

Defined in GHC.Base

Monoid Ordering

Since: base-2.1

Instance details

Defined in GHC.Base

Hashable Ordering 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Ordering -> Int #

hash :: Ordering -> Int #

NFData Ordering 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Ordering -> () #

Default Ordering 
Instance details

Defined in Data.Default.Class

Methods

def :: Ordering #

PMonoid Ordering 
Instance details

Defined in Data.Singletons.Prelude.Monoid

Associated Types

type Mempty :: a0 #

type Mappend arg0 arg1 :: a0 #

type Mconcat arg0 :: a0 #

SMonoid Ordering 
Instance details

Defined in Data.Singletons.Prelude.Monoid

Methods

sMempty :: Sing MemptySym0 #

sMappend :: forall (t1 :: Ordering) (t2 :: Ordering). Sing t1 -> Sing t2 -> Sing (Apply (Apply MappendSym0 t1) t2) #

sMconcat :: forall (t :: [Ordering]). Sing t -> Sing (Apply MconcatSym0 t) #

PShow Ordering 
Instance details

Defined in Data.Singletons.Prelude.Show

Associated Types

type ShowsPrec arg0 arg1 arg2 :: Symbol #

type Show_ arg0 :: Symbol #

type ShowList arg0 arg1 :: Symbol #

SShow Ordering 
Instance details

Defined in Data.Singletons.Prelude.Show

Methods

sShowsPrec :: forall (t1 :: Nat) (t2 :: Ordering) (t3 :: Symbol). Sing t1 -> Sing t2 -> Sing t3 -> Sing (Apply (Apply (Apply ShowsPrecSym0 t1) t2) t3) #

sShow_ :: forall (t :: Ordering). Sing t -> Sing (Apply Show_Sym0 t) #

sShowList :: forall (t1 :: [Ordering]) (t2 :: Symbol). Sing t1 -> Sing t2 -> Sing (Apply (Apply ShowListSym0 t1) t2) #

PSemigroup Ordering 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

Associated Types

type arg0 <> arg1 :: a0 #

type Sconcat arg0 :: a0 #

SSemigroup Ordering 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

Methods

(%<>) :: forall (t1 :: Ordering) (t2 :: Ordering). Sing t1 -> Sing t2 -> Sing (Apply (Apply (<>@#@$) t1) t2) #

sSconcat :: forall (t :: NonEmpty Ordering). Sing t -> Sing (Apply SconcatSym0 t) #

PEnum Ordering 
Instance details

Defined in Data.Singletons.Prelude.Enum

Associated Types

type Succ arg0 :: a0 #

type Pred arg0 :: a0 #

type ToEnum arg0 :: a0 #

type FromEnum arg0 :: Nat #

type EnumFromTo arg0 arg1 :: [a0] #

type EnumFromThenTo arg0 arg1 arg2 :: [a0] #

SEnum Ordering 
Instance details

Defined in Data.Singletons.Prelude.Enum

Methods

sSucc :: forall (t :: Ordering). Sing t -> Sing (Apply SuccSym0 t) #

sPred :: forall (t :: Ordering). Sing t -> Sing (Apply PredSym0 t) #

sToEnum :: forall (t :: Nat). Sing t -> Sing (Apply ToEnumSym0 t) #

sFromEnum :: forall (t :: Ordering). Sing t -> Sing (Apply FromEnumSym0 t) #

sEnumFromTo :: forall (t1 :: Ordering) (t2 :: Ordering). Sing t1 -> Sing t2 -> Sing (Apply (Apply EnumFromToSym0 t1) t2) #

sEnumFromThenTo :: forall (t1 :: Ordering) (t2 :: Ordering) (t3 :: Ordering). Sing t1 -> Sing t2 -> Sing t3 -> Sing (Apply (Apply (Apply EnumFromThenToSym0 t1) t2) t3) #

PBounded Ordering 
Instance details

Defined in Data.Singletons.Prelude.Enum

Associated Types

type MinBound :: a0 #

type MaxBound :: a0 #

SBounded Ordering 
Instance details

Defined in Data.Singletons.Prelude.Enum

POrd Ordering 
Instance details

Defined in Data.Singletons.Prelude.Ord

Associated Types

type Compare arg0 arg1 :: Ordering #

type arg0 < arg1 :: Bool #

type arg0 <= arg1 :: Bool #

type arg0 > arg1 :: Bool #

type arg0 >= arg1 :: Bool #

type Max arg0 arg1 :: a0 #

type Min arg0 arg1 :: a0 #

SOrd Ordering 
Instance details

Defined in Data.Singletons.Prelude.Ord

Methods

sCompare :: forall (t1 :: Ordering) (t2 :: Ordering). Sing t1 -> Sing t2 -> Sing (Apply (Apply CompareSym0 t1) t2) #

(%<) :: forall (t1 :: Ordering) (t2 :: Ordering). Sing t1 -> Sing t2 -> Sing (Apply (Apply (<@#@$) t1) t2) #

(%<=) :: forall (t1 :: Ordering) (t2 :: Ordering). Sing t1 -> Sing t2 -> Sing (Apply (Apply (<=@#@$) t1) t2) #

(%>) :: forall (t1 :: Ordering) (t2 :: Ordering). Sing t1 -> Sing t2 -> Sing (Apply (Apply (>@#@$) t1) t2) #

(%>=) :: forall (t1 :: Ordering) (t2 :: Ordering). Sing t1 -> Sing t2 -> Sing (Apply (Apply (>=@#@$) t1) t2) #

sMax :: forall (t1 :: Ordering) (t2 :: Ordering). Sing t1 -> Sing t2 -> Sing (Apply (Apply MaxSym0 t1) t2) #

sMin :: forall (t1 :: Ordering) (t2 :: Ordering). Sing t1 -> Sing t2 -> Sing (Apply (Apply MinSym0 t1) t2) #

SEq Ordering 
Instance details

Defined in Data.Singletons.Prelude.Eq

Methods

(%==) :: forall (a :: Ordering) (b :: Ordering). Sing a -> Sing b -> Sing (a == b) #

(%/=) :: forall (a :: Ordering) (b :: Ordering). Sing a -> Sing b -> Sing (a /= b) #

PEq Ordering 
Instance details

Defined in Data.Singletons.Prelude.Eq

Associated Types

type x == y :: Bool #

type x /= y :: Bool #

TestCoercion SOrdering 
Instance details

Defined in Data.Singletons.Prelude.Instances

Methods

testCoercion :: forall (a :: k) (b :: k). SOrdering a -> SOrdering b -> Maybe (Coercion a b) #

TestEquality SOrdering 
Instance details

Defined in Data.Singletons.Prelude.Instances

Methods

testEquality :: forall (a :: k) (b :: k). SOrdering a -> SOrdering b -> Maybe (a :~: b) #

() :=> (Bounded Ordering) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Bounded Ordering #

() :=> (Enum Ordering) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Enum Ordering #

() :=> (Read Ordering) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Read Ordering #

() :=> (Show Ordering) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Show Ordering #

() :=> (Semigroup Ordering) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Semigroup Ordering #

() :=> (Monoid Ordering) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Monoid Ordering #

SingI ThenCmpSym0 
Instance details

Defined in Data.Singletons.Prelude.Ord

SuppressUnusedWarnings Compare_6989586621679803720Sym0 
Instance details

Defined in Data.Singletons.Prelude.Ord

SuppressUnusedWarnings FromEnum_6989586621680152610Sym0 
Instance details

Defined in Data.Singletons.Prelude.Enum

SuppressUnusedWarnings ThenCmpSym0 
Instance details

Defined in Data.Singletons.Prelude.Ord

SuppressUnusedWarnings Compare_6989586621679803730Sym0 
Instance details

Defined in Data.Singletons.Prelude.Ord

SuppressUnusedWarnings ToEnum_6989586621680152594Sym0 
Instance details

Defined in Data.Singletons.Prelude.Enum

SuppressUnusedWarnings ShowsPrec_6989586621680595883Sym0 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings Compare_6989586621679803740Sym0 
Instance details

Defined in Data.Singletons.Prelude.Ord

SuppressUnusedWarnings Compare_6989586621679803332Sym0 
Instance details

Defined in Data.Singletons.Prelude.Ord

SuppressUnusedWarnings Compare_6989586621680206622Sym0 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings Compare_6989586621680206640Sym0 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SingI d => SingI (ThenCmpSym1 d :: TyFun Ordering Ordering -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

Methods

sing :: Sing (ThenCmpSym1 d) #

SOrd a => SingI (CompareSym0 :: TyFun a (a ~> Ordering) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

SingI (ListsortBySym0 :: TyFun (a ~> (a ~> Ordering)) ([a] ~> [a]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

Methods

sing :: Sing ListsortBySym0 #

SingI (SortBySym0 :: TyFun (a ~> (a ~> Ordering)) ([a] ~> [a]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing SortBySym0 #

SingI (MinimumBySym0 :: TyFun (a ~> (a ~> Ordering)) ([a] ~> a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing MinimumBySym0 #

SingI (MaximumBySym0 :: TyFun (a ~> (a ~> Ordering)) ([a] ~> a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

Methods

sing :: Sing MaximumBySym0 #

SingI (InsertBySym0 :: TyFun (a ~> (a ~> Ordering)) (a ~> ([a] ~> [a])) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (Compare_6989586621679803720Sym1 a6989586621679803718 :: TyFun Bool Ordering -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

SuppressUnusedWarnings (Compare_6989586621679803239Sym0 :: TyFun [a3530822107858468865] ([a3530822107858468865] ~> Ordering) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

SuppressUnusedWarnings (Compare_6989586621679803207Sym0 :: TyFun (Maybe a3530822107858468865) (Maybe a3530822107858468865 ~> Ordering) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

SuppressUnusedWarnings (ThenCmpSym1 a6989586621679802827 :: TyFun Ordering Ordering -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

SuppressUnusedWarnings (Compare_6989586621679803730Sym1 a6989586621679803728 :: TyFun Ordering Ordering -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

SuppressUnusedWarnings (ShowsPrec_6989586621680595883Sym1 a6989586621680595880 :: TyFun Ordering (Symbol ~> Symbol) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (Compare_6989586621679803740Sym1 a6989586621679803738 :: TyFun () Ordering -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

SuppressUnusedWarnings (Let6989586621679792586Scrutinee_6989586621679792409Sym0 :: TyFun k1 (TyFun k1 Ordering -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

SuppressUnusedWarnings (Let6989586621679792568Scrutinee_6989586621679792407Sym0 :: TyFun k1 (TyFun k1 Ordering -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

SuppressUnusedWarnings (Let6989586621679792550Scrutinee_6989586621679792405Sym0 :: TyFun k1 (TyFun k1 Ordering -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

SuppressUnusedWarnings (Let6989586621679792532Scrutinee_6989586621679792403Sym0 :: TyFun k1 (TyFun k1 Ordering -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

SuppressUnusedWarnings (Compare_6989586621679792500Sym0 :: TyFun a6989586621679792381 (a6989586621679792381 ~> Ordering) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

SuppressUnusedWarnings (CompareSym0 :: TyFun a6989586621679792381 (a6989586621679792381 ~> Ordering) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

SuppressUnusedWarnings (Compare_6989586621679803332Sym1 a6989586621679803330 :: TyFun Void Ordering -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

SuppressUnusedWarnings (Compare_6989586621680206703Sym0 :: TyFun (Min a6989586621679060068) (Min a6989586621679060068 ~> Ordering) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (Compare_6989586621680206724Sym0 :: TyFun (Max a6989586621679060073) (Max a6989586621679060073 ~> Ordering) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (Compare_6989586621680206745Sym0 :: TyFun (First a6989586621679060083) (First a6989586621679060083 ~> Ordering) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (Compare_6989586621680206766Sym0 :: TyFun (Last a6989586621679060078) (Last a6989586621679060078 ~> Ordering) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (Compare_6989586621680206787Sym0 :: TyFun (WrappedMonoid m6989586621679090730) (WrappedMonoid m6989586621679090730 ~> Ordering) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (Compare_6989586621680206583Sym0 :: TyFun (Option a6989586621679060063) (Option a6989586621679060063 ~> Ordering) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (Compare_6989586621679803706Sym0 :: TyFun (Identity a6989586621679087410) (Identity a6989586621679087410 ~> Ordering) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

SuppressUnusedWarnings (Compare_6989586621680636482Sym0 :: TyFun (First a6989586621679087424) (First a6989586621679087424 ~> Ordering) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

SuppressUnusedWarnings (Compare_6989586621680636503Sym0 :: TyFun (Last a6989586621679087417) (Last a6989586621679087417 ~> Ordering) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

SuppressUnusedWarnings (Compare_6989586621680206604Sym0 :: TyFun (Dual a6989586621679087483) (Dual a6989586621679087483 ~> Ordering) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (Compare_6989586621680206622Sym1 a6989586621680206620 :: TyFun All Ordering -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (Compare_6989586621680206640Sym1 a6989586621680206638 :: TyFun Any Ordering -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (Compare_6989586621680206661Sym0 :: TyFun (Sum a6989586621679087460) (Sum a6989586621679087460 ~> Ordering) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (Compare_6989586621680206682Sym0 :: TyFun (Product a6989586621679087468) (Product a6989586621679087468 ~> Ordering) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (Compare_6989586621679801934Sym0 :: TyFun (Down a6989586621679801914) (Down a6989586621679801914 ~> Ordering) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

SuppressUnusedWarnings (Compare_6989586621679803314Sym0 :: TyFun (NonEmpty a6989586621679060149) (NonEmpty a6989586621679060149 ~> Ordering) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

SuppressUnusedWarnings (ListsortBySym0 :: TyFun (a6989586621680686806 ~> (a6989586621680686806 ~> Ordering)) ([a6989586621680686806] ~> [a6989586621680686806]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

SuppressUnusedWarnings (SortBySym0 :: TyFun (a6989586621680316355 ~> (a6989586621680316355 ~> Ordering)) ([a6989586621680316355] ~> [a6989586621680316355]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (MinimumBySym0 :: TyFun (a6989586621680316352 ~> (a6989586621680316352 ~> Ordering)) ([a6989586621680316352] ~> a6989586621680316352) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (MaximumBySym0 :: TyFun (a6989586621680316353 ~> (a6989586621680316353 ~> Ordering)) ([a6989586621680316353] ~> a6989586621680316353) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (InsertBySym0 :: TyFun (a6989586621680316354 ~> (a6989586621680316354 ~> Ordering)) (a6989586621680316354 ~> ([a6989586621680316354] ~> [a6989586621680316354])) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

(SOrd a, SingI d) => SingI (CompareSym1 d :: TyFun a Ordering -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

Methods

sing :: Sing (CompareSym1 d) #

SFoldable t => SingI (MinimumBySym0 :: TyFun (a ~> (a ~> Ordering)) (t a ~> a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SFoldable t => SingI (MaximumBySym0 :: TyFun (a ~> (a ~> Ordering)) (t a ~> a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SOrd a => SingI (ComparingSym0 :: TyFun (b ~> a) (b ~> (b ~> Ordering)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

SuppressUnusedWarnings (Compare_6989586621679803239Sym1 a6989586621679803237 :: TyFun [a3530822107858468865] Ordering -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

SuppressUnusedWarnings (Compare_6989586621679803207Sym1 a6989586621679803205 :: TyFun (Maybe a3530822107858468865) Ordering -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

SuppressUnusedWarnings (Compare_6989586621679803285Sym0 :: TyFun (Either a6989586621679091038 b6989586621679091039) (Either a6989586621679091038 b6989586621679091039 ~> Ordering) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

SuppressUnusedWarnings (Compare_6989586621679803356Sym0 :: TyFun (a3530822107858468865, b3530822107858468866) ((a3530822107858468865, b3530822107858468866) ~> Ordering) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

SuppressUnusedWarnings (Let6989586621679792586Scrutinee_6989586621679792409Sym1 x6989586621679792584 :: TyFun k1 Ordering -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

SuppressUnusedWarnings (Let6989586621679792568Scrutinee_6989586621679792407Sym1 x6989586621679792566 :: TyFun k1 Ordering -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

SuppressUnusedWarnings (Let6989586621679792550Scrutinee_6989586621679792405Sym1 x6989586621679792548 :: TyFun k1 Ordering -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

SuppressUnusedWarnings (Let6989586621679792532Scrutinee_6989586621679792403Sym1 x6989586621679792530 :: TyFun k1 Ordering -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

SuppressUnusedWarnings (Compare_6989586621679792500Sym1 a6989586621679792498 :: TyFun a6989586621679792381 Ordering -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

SuppressUnusedWarnings (CompareSym1 arg6989586621679792470 :: TyFun a6989586621679792381 Ordering -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

SuppressUnusedWarnings (Compare_6989586621680206703Sym1 a6989586621680206701 :: TyFun (Min a6989586621679060068) Ordering -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (Compare_6989586621680206724Sym1 a6989586621680206722 :: TyFun (Max a6989586621679060073) Ordering -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (Compare_6989586621681108340Sym0 :: TyFun (Arg a6989586621681107128 b6989586621681107129) (Arg a6989586621681107128 b6989586621681107129 ~> Ordering) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (Compare_6989586621680206745Sym1 a6989586621680206743 :: TyFun (First a6989586621679060083) Ordering -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (Compare_6989586621680206766Sym1 a6989586621680206764 :: TyFun (Last a6989586621679060078) Ordering -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (Compare_6989586621680206787Sym1 a6989586621680206785 :: TyFun (WrappedMonoid m6989586621679090730) Ordering -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (Compare_6989586621680206583Sym1 a6989586621680206581 :: TyFun (Option a6989586621679060063) Ordering -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (Compare_6989586621679803706Sym1 a6989586621679803704 :: TyFun (Identity a6989586621679087410) Ordering -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

SuppressUnusedWarnings (Compare_6989586621680636482Sym1 a6989586621680636480 :: TyFun (First a6989586621679087424) Ordering -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

SuppressUnusedWarnings (Compare_6989586621680636503Sym1 a6989586621680636501 :: TyFun (Last a6989586621679087417) Ordering -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

SuppressUnusedWarnings (Compare_6989586621680206604Sym1 a6989586621680206602 :: TyFun (Dual a6989586621679087483) Ordering -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (Compare_6989586621680206661Sym1 a6989586621680206659 :: TyFun (Sum a6989586621679087460) Ordering -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (Compare_6989586621680206682Sym1 a6989586621680206680 :: TyFun (Product a6989586621679087468) Ordering -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (Compare_6989586621679801934Sym1 a6989586621679801932 :: TyFun (Down a6989586621679801914) Ordering -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

SuppressUnusedWarnings (Compare_6989586621679803314Sym1 a6989586621679803312 :: TyFun (NonEmpty a6989586621679060149) Ordering -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

SuppressUnusedWarnings (MinimumBySym0 :: TyFun (a6989586621680742294 ~> (a6989586621680742294 ~> Ordering)) (t6989586621680742293 a6989586621680742294 ~> a6989586621680742294) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (MaximumBySym0 :: TyFun (a6989586621680742296 ~> (a6989586621680742296 ~> Ordering)) (t6989586621680742295 a6989586621680742296 ~> a6989586621680742296) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (Let6989586621680742811Max'Sym0 :: TyFun (k1 ~> (k1 ~> Ordering)) (TyFun k2 (TyFun k1 (TyFun k1 k1 -> Type) -> Type) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (Let6989586621680742786Min'Sym0 :: TyFun (k1 ~> (k1 ~> Ordering)) (TyFun k2 (TyFun k1 (TyFun k1 k1 -> Type) -> Type) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (ComparingSym0 :: TyFun (b6989586621679792371 ~> a6989586621679792370) (b6989586621679792371 ~> (b6989586621679792371 ~> Ordering)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

(SOrd a, SingI d) => SingI (ComparingSym1 d :: TyFun b (b ~> Ordering) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

Methods

sing :: Sing (ComparingSym1 d) #

SuppressUnusedWarnings (Compare_6989586621679803285Sym1 a6989586621679803283 :: TyFun (Either a6989586621679091038 b6989586621679091039) Ordering -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

SuppressUnusedWarnings (Compare_6989586621679803356Sym1 a6989586621679803354 :: TyFun (a3530822107858468865, b3530822107858468866) Ordering -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

SuppressUnusedWarnings (Compare_6989586621679803395Sym0 :: TyFun (a3530822107858468865, b3530822107858468866, c3530822107858468867) ((a3530822107858468865, b3530822107858468866, c3530822107858468867) ~> Ordering) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

SuppressUnusedWarnings (ComparingSym1 a6989586621679792461 :: TyFun b6989586621679792371 (b6989586621679792371 ~> Ordering) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

SuppressUnusedWarnings (Compare_6989586621681108340Sym1 a6989586621681108338 :: TyFun (Arg a6989586621681107128 b6989586621681107129) Ordering -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (Compare_6989586621680953507Sym0 :: TyFun (Const a6989586621680952767 b6989586621680952768) (Const a6989586621680952767 b6989586621680952768 ~> Ordering) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Const

SuppressUnusedWarnings (Let6989586621680320962MaxBySym0 :: TyFun (k1 ~> (k1 ~> Ordering)) (TyFun k2 (TyFun k3 (TyFun k1 (TyFun k1 k1 -> Type) -> Type) -> Type) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

SuppressUnusedWarnings (Let6989586621680320932MinBySym0 :: TyFun (k1 ~> (k1 ~> Ordering)) (TyFun k2 (TyFun k3 (TyFun k1 (TyFun k1 k1 -> Type) -> Type) -> Type) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

(SOrd a, SingI d1, SingI d2) => SingI (ComparingSym2 d1 d2 :: TyFun b Ordering -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

Methods

sing :: Sing (ComparingSym2 d1 d2) #

SuppressUnusedWarnings (Compare_6989586621679803395Sym1 a6989586621679803393 :: TyFun (a3530822107858468865, b3530822107858468866, c3530822107858468867) Ordering -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

SuppressUnusedWarnings (Compare_6989586621679803445Sym0 :: TyFun (a3530822107858468865, b3530822107858468866, c3530822107858468867, d3530822107858468868) ((a3530822107858468865, b3530822107858468866, c3530822107858468867, d3530822107858468868) ~> Ordering) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

SuppressUnusedWarnings (ComparingSym2 a6989586621679792462 a6989586621679792461 :: TyFun b6989586621679792371 Ordering -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

SuppressUnusedWarnings (Compare_6989586621680953507Sym1 a6989586621680953505 :: TyFun (Const a6989586621680952767 b6989586621680952768) Ordering -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Const

SuppressUnusedWarnings (Compare_6989586621679803445Sym1 a6989586621679803443 :: TyFun (a3530822107858468865, b3530822107858468866, c3530822107858468867, d3530822107858468868) Ordering -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

SuppressUnusedWarnings (Compare_6989586621679803506Sym0 :: TyFun (a3530822107858468865, b3530822107858468866, c3530822107858468867, d3530822107858468868, e3530822107858468869) ((a3530822107858468865, b3530822107858468866, c3530822107858468867, d3530822107858468868, e3530822107858468869) ~> Ordering) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

SuppressUnusedWarnings (Compare_6989586621679803506Sym1 a6989586621679803504 :: TyFun (a3530822107858468865, b3530822107858468866, c3530822107858468867, d3530822107858468868, e3530822107858468869) Ordering -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

SuppressUnusedWarnings (Compare_6989586621679803578Sym0 :: TyFun (a3530822107858468865, b3530822107858468866, c3530822107858468867, d3530822107858468868, e3530822107858468869, f3530822107858468870) ((a3530822107858468865, b3530822107858468866, c3530822107858468867, d3530822107858468868, e3530822107858468869, f3530822107858468870) ~> Ordering) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

SuppressUnusedWarnings (Compare_6989586621679803578Sym1 a6989586621679803576 :: TyFun (a3530822107858468865, b3530822107858468866, c3530822107858468867, d3530822107858468868, e3530822107858468869, f3530822107858468870) Ordering -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

SuppressUnusedWarnings (Compare_6989586621679803661Sym0 :: TyFun (a3530822107858468865, b3530822107858468866, c3530822107858468867, d3530822107858468868, e3530822107858468869, f3530822107858468870, g3530822107858468871) ((a3530822107858468865, b3530822107858468866, c3530822107858468867, d3530822107858468868, e3530822107858468869, f3530822107858468870, g3530822107858468871) ~> Ordering) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

SuppressUnusedWarnings (Compare_6989586621679803661Sym1 a6989586621679803659 :: TyFun (a3530822107858468865, b3530822107858468866, c3530822107858468867, d3530822107858468868, e3530822107858468869, f3530822107858468870, g3530822107858468871) Ordering -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Rep Ordering 
Instance details

Defined in GHC.Generics

type Rep Ordering = D1 ('MetaData "Ordering" "GHC.Types" "ghc-prim" 'False) (C1 ('MetaCons "LT" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "EQ" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "GT" 'PrefixI 'False) (U1 :: Type -> Type)))
type Sing 
Instance details

Defined in Data.Singletons.Prelude.Instances

type Mempty 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Mempty = Mempty_6989586621680631382Sym0 :: Ordering
type MaxBound 
Instance details

Defined in Data.Singletons.Prelude.Enum

type MaxBound = MaxBound_6989586621680125218Sym0
type MinBound 
Instance details

Defined in Data.Singletons.Prelude.Enum

type MinBound = MinBound_6989586621680125216Sym0
type Demote Ordering 
Instance details

Defined in Data.Singletons.Prelude.Instances

type Mconcat (arg0 :: [Ordering]) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Mconcat (arg0 :: [Ordering]) = Apply (Mconcat_6989586621680631303Sym0 :: TyFun [Ordering] Ordering -> Type) arg0
type Show_ (arg0 :: Ordering) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Show_ (arg0 :: Ordering) = Apply (Show__6989586621680577846Sym0 :: TyFun Ordering Symbol -> Type) arg0
type Sconcat (arg0 :: NonEmpty Ordering) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Sconcat (arg0 :: NonEmpty Ordering) = Apply (Sconcat_6989586621680187691Sym0 :: TyFun (NonEmpty Ordering) Ordering -> Type) arg0
type FromEnum (a :: Ordering) 
Instance details

Defined in Data.Singletons.Prelude.Enum

type FromEnum (a :: Ordering) = Apply FromEnum_6989586621680152610Sym0 a
type ToEnum a 
Instance details

Defined in Data.Singletons.Prelude.Enum

type ToEnum a = Apply ToEnum_6989586621680152594Sym0 a
type Pred (arg0 :: Ordering) 
Instance details

Defined in Data.Singletons.Prelude.Enum

type Pred (arg0 :: Ordering) = Apply (Pred_6989586621680129239Sym0 :: TyFun Ordering Ordering -> Type) arg0
type Succ (arg0 :: Ordering) 
Instance details

Defined in Data.Singletons.Prelude.Enum

type Succ (arg0 :: Ordering) = Apply (Succ_6989586621680129224Sym0 :: TyFun Ordering Ordering -> Type) arg0
type Mappend (arg1 :: Ordering) (arg2 :: Ordering) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Mappend (arg1 :: Ordering) (arg2 :: Ordering) = Apply (Apply (Mappend_6989586621680631288Sym0 :: TyFun Ordering (Ordering ~> Ordering) -> Type) arg1) arg2
type ShowList (arg1 :: [Ordering]) arg2 
Instance details

Defined in Data.Singletons.Prelude.Show

type ShowList (arg1 :: [Ordering]) arg2 = Apply (Apply (ShowList_6989586621680577854Sym0 :: TyFun [Ordering] (Symbol ~> Symbol) -> Type) arg1) arg2
type (a1 :: Ordering) <> (a2 :: Ordering) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type (a1 :: Ordering) <> (a2 :: Ordering) = Apply (Apply (TFHelper_6989586621680187911Sym0 :: TyFun Ordering (Ordering ~> Ordering) -> Type) a1) a2
type EnumFromTo (arg1 :: Ordering) (arg2 :: Ordering) 
Instance details

Defined in Data.Singletons.Prelude.Enum

type EnumFromTo (arg1 :: Ordering) (arg2 :: Ordering) = Apply (Apply (EnumFromTo_6989586621680129249Sym0 :: TyFun Ordering (Ordering ~> [Ordering]) -> Type) arg1) arg2
type Min (arg1 :: Ordering) (arg2 :: Ordering) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Min (arg1 :: Ordering) (arg2 :: Ordering) = Apply (Apply (Min_6989586621679792614Sym0 :: TyFun Ordering (Ordering ~> Ordering) -> Type) arg1) arg2
type Max (arg1 :: Ordering) (arg2 :: Ordering) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Max (arg1 :: Ordering) (arg2 :: Ordering) = Apply (Apply (Max_6989586621679792596Sym0 :: TyFun Ordering (Ordering ~> Ordering) -> Type) arg1) arg2
type (arg1 :: Ordering) >= (arg2 :: Ordering) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type (arg1 :: Ordering) >= (arg2 :: Ordering) = Apply (Apply (TFHelper_6989586621679792578Sym0 :: TyFun Ordering (Ordering ~> Bool) -> Type) arg1) arg2
type (arg1 :: Ordering) > (arg2 :: Ordering) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type (arg1 :: Ordering) > (arg2 :: Ordering) = Apply (Apply (TFHelper_6989586621679792560Sym0 :: TyFun Ordering (Ordering ~> Bool) -> Type) arg1) arg2
type (arg1 :: Ordering) <= (arg2 :: Ordering) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type (arg1 :: Ordering) <= (arg2 :: Ordering) = Apply (Apply (TFHelper_6989586621679792542Sym0 :: TyFun Ordering (Ordering ~> Bool) -> Type) arg1) arg2
type (arg1 :: Ordering) < (arg2 :: Ordering) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type (arg1 :: Ordering) < (arg2 :: Ordering) = Apply (Apply (TFHelper_6989586621679792524Sym0 :: TyFun Ordering (Ordering ~> Bool) -> Type) arg1) arg2
type Compare (a1 :: Ordering) (a2 :: Ordering) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Compare (a1 :: Ordering) (a2 :: Ordering) = Apply (Apply Compare_6989586621679803730Sym0 a1) a2
type (x :: Ordering) /= (y :: Ordering) 
Instance details

Defined in Data.Singletons.Prelude.Eq

type (x :: Ordering) /= (y :: Ordering) = Not (x == y)
type (a :: Ordering) == (b :: Ordering) 
Instance details

Defined in Data.Singletons.Prelude.Eq

type (a :: Ordering) == (b :: Ordering) = Equals_6989586621679776478 a b
type ShowsPrec a1 (a2 :: Ordering) a3 
Instance details

Defined in Data.Singletons.Prelude.Show

type ShowsPrec a1 (a2 :: Ordering) a3 = Apply (Apply (Apply ShowsPrec_6989586621680595883Sym0 a1) a2) a3
type EnumFromThenTo (arg1 :: Ordering) (arg2 :: Ordering) (arg3 :: Ordering) 
Instance details

Defined in Data.Singletons.Prelude.Enum

type EnumFromThenTo (arg1 :: Ordering) (arg2 :: Ordering) (arg3 :: Ordering) = Apply (Apply (Apply (EnumFromThenTo_6989586621680129262Sym0 :: TyFun Ordering (Ordering ~> (Ordering ~> [Ordering])) -> Type) arg1) arg2) arg3
type Apply FromEnum_6989586621680152610Sym0 (a6989586621680152609 :: Ordering) 
Instance details

Defined in Data.Singletons.Prelude.Enum

type Apply FromEnum_6989586621680152610Sym0 (a6989586621680152609 :: Ordering) = FromEnum_6989586621680152610 a6989586621680152609
type Apply ToEnum_6989586621680152594Sym0 (a6989586621680152593 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Enum

type Apply ToEnum_6989586621680152594Sym0 (a6989586621680152593 :: Nat) = ToEnum_6989586621680152594 a6989586621680152593
type Apply (Compare_6989586621679803720Sym1 a6989586621679803718 :: TyFun Bool Ordering -> Type) (a6989586621679803719 :: Bool) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Apply (Compare_6989586621679803720Sym1 a6989586621679803718 :: TyFun Bool Ordering -> Type) (a6989586621679803719 :: Bool) = Compare_6989586621679803720 a6989586621679803718 a6989586621679803719
type Apply (ThenCmpSym1 a6989586621679802827 :: TyFun Ordering Ordering -> Type) (a6989586621679802828 :: Ordering) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Apply (ThenCmpSym1 a6989586621679802827 :: TyFun Ordering Ordering -> Type) (a6989586621679802828 :: Ordering) = ThenCmp a6989586621679802827 a6989586621679802828
type Apply (Compare_6989586621679803730Sym1 a6989586621679803728 :: TyFun Ordering Ordering -> Type) (a6989586621679803729 :: Ordering) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Apply (Compare_6989586621679803730Sym1 a6989586621679803728 :: TyFun Ordering Ordering -> Type) (a6989586621679803729 :: Ordering) = Compare_6989586621679803730 a6989586621679803728 a6989586621679803729
type Apply (Compare_6989586621679803740Sym1 a6989586621679803738 :: TyFun () Ordering -> Type) (a6989586621679803739 :: ()) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Apply (Compare_6989586621679803740Sym1 a6989586621679803738 :: TyFun () Ordering -> Type) (a6989586621679803739 :: ()) = Compare_6989586621679803740 a6989586621679803738 a6989586621679803739
type Apply (Compare_6989586621679803332Sym1 a6989586621679803330 :: TyFun Void Ordering -> Type) (a6989586621679803331 :: Void) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Apply (Compare_6989586621679803332Sym1 a6989586621679803330 :: TyFun Void Ordering -> Type) (a6989586621679803331 :: Void) = Compare_6989586621679803332 a6989586621679803330 a6989586621679803331
type Apply (Compare_6989586621680206622Sym1 a6989586621680206620 :: TyFun All Ordering -> Type) (a6989586621680206621 :: All) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (Compare_6989586621680206622Sym1 a6989586621680206620 :: TyFun All Ordering -> Type) (a6989586621680206621 :: All) = Compare_6989586621680206622 a6989586621680206620 a6989586621680206621
type Apply (Compare_6989586621680206640Sym1 a6989586621680206638 :: TyFun Any Ordering -> Type) (a6989586621680206639 :: Any) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (Compare_6989586621680206640Sym1 a6989586621680206638 :: TyFun Any Ordering -> Type) (a6989586621680206639 :: Any) = Compare_6989586621680206640 a6989586621680206638 a6989586621680206639
type Apply (Compare_6989586621679792500Sym1 a6989586621679792498 :: TyFun a Ordering -> Type) (a6989586621679792499 :: a) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Apply (Compare_6989586621679792500Sym1 a6989586621679792498 :: TyFun a Ordering -> Type) (a6989586621679792499 :: a) = Compare_6989586621679792500 a6989586621679792498 a6989586621679792499
type Apply (CompareSym1 arg6989586621679792470 :: TyFun a Ordering -> Type) (arg6989586621679792471 :: a) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Apply (CompareSym1 arg6989586621679792470 :: TyFun a Ordering -> Type) (arg6989586621679792471 :: a) = Compare arg6989586621679792470 arg6989586621679792471
type Apply (Let6989586621679792586Scrutinee_6989586621679792409Sym1 x6989586621679792584 :: TyFun k1 Ordering -> Type) (y6989586621679792585 :: k1) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Apply (Let6989586621679792586Scrutinee_6989586621679792409Sym1 x6989586621679792584 :: TyFun k1 Ordering -> Type) (y6989586621679792585 :: k1) = Let6989586621679792586Scrutinee_6989586621679792409 x6989586621679792584 y6989586621679792585
type Apply (Let6989586621679792568Scrutinee_6989586621679792407Sym1 x6989586621679792566 :: TyFun k1 Ordering -> Type) (y6989586621679792567 :: k1) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Apply (Let6989586621679792568Scrutinee_6989586621679792407Sym1 x6989586621679792566 :: TyFun k1 Ordering -> Type) (y6989586621679792567 :: k1) = Let6989586621679792568Scrutinee_6989586621679792407 x6989586621679792566 y6989586621679792567
type Apply (Let6989586621679792550Scrutinee_6989586621679792405Sym1 x6989586621679792548 :: TyFun k1 Ordering -> Type) (y6989586621679792549 :: k1) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Apply (Let6989586621679792550Scrutinee_6989586621679792405Sym1 x6989586621679792548 :: TyFun k1 Ordering -> Type) (y6989586621679792549 :: k1) = Let6989586621679792550Scrutinee_6989586621679792405 x6989586621679792548 y6989586621679792549
type Apply (Let6989586621679792532Scrutinee_6989586621679792403Sym1 x6989586621679792530 :: TyFun k1 Ordering -> Type) (y6989586621679792531 :: k1) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Apply (Let6989586621679792532Scrutinee_6989586621679792403Sym1 x6989586621679792530 :: TyFun k1 Ordering -> Type) (y6989586621679792531 :: k1) = Let6989586621679792532Scrutinee_6989586621679792403 x6989586621679792530 y6989586621679792531
type Apply (ComparingSym2 a6989586621679792462 a6989586621679792461 :: TyFun b Ordering -> Type) (a6989586621679792463 :: b) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Apply (ComparingSym2 a6989586621679792462 a6989586621679792461 :: TyFun b Ordering -> Type) (a6989586621679792463 :: b) = Comparing a6989586621679792462 a6989586621679792461 a6989586621679792463
type Apply Compare_6989586621679803720Sym0 (a6989586621679803718 :: Bool) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Apply Compare_6989586621679803720Sym0 (a6989586621679803718 :: Bool) = Compare_6989586621679803720Sym1 a6989586621679803718
type Apply ThenCmpSym0 (a6989586621679802827 :: Ordering) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Apply ThenCmpSym0 (a6989586621679802827 :: Ordering) = ThenCmpSym1 a6989586621679802827
type Apply Compare_6989586621679803730Sym0 (a6989586621679803728 :: Ordering) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Apply Compare_6989586621679803730Sym0 (a6989586621679803728 :: Ordering) = Compare_6989586621679803730Sym1 a6989586621679803728
type Apply ShowsPrec_6989586621680595883Sym0 (a6989586621680595880 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply ShowsPrec_6989586621680595883Sym0 (a6989586621680595880 :: Nat) = ShowsPrec_6989586621680595883Sym1 a6989586621680595880
type Apply Compare_6989586621679803740Sym0 (a6989586621679803738 :: ()) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Apply Compare_6989586621679803740Sym0 (a6989586621679803738 :: ()) = Compare_6989586621679803740Sym1 a6989586621679803738
type Apply Compare_6989586621679803332Sym0 (a6989586621679803330 :: Void) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Apply Compare_6989586621679803332Sym0 (a6989586621679803330 :: Void) = Compare_6989586621679803332Sym1 a6989586621679803330
type Apply Compare_6989586621680206622Sym0 (a6989586621680206620 :: All) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply Compare_6989586621680206622Sym0 (a6989586621680206620 :: All) = Compare_6989586621680206622Sym1 a6989586621680206620
type Apply Compare_6989586621680206640Sym0 (a6989586621680206638 :: Any) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply Compare_6989586621680206640Sym0 (a6989586621680206638 :: Any) = Compare_6989586621680206640Sym1 a6989586621680206638
type Apply (ShowsPrec_6989586621680595883Sym1 a6989586621680595880 :: TyFun Ordering (Symbol ~> Symbol) -> Type) (a6989586621680595881 :: Ordering) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680595883Sym1 a6989586621680595880 :: TyFun Ordering (Symbol ~> Symbol) -> Type) (a6989586621680595881 :: Ordering) = ShowsPrec_6989586621680595883Sym2 a6989586621680595880 a6989586621680595881
type Apply (Compare_6989586621679792500Sym0 :: TyFun a6989586621679792381 (a6989586621679792381 ~> Ordering) -> Type) (a6989586621679792498 :: a6989586621679792381) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Apply (Compare_6989586621679792500Sym0 :: TyFun a6989586621679792381 (a6989586621679792381 ~> Ordering) -> Type) (a6989586621679792498 :: a6989586621679792381) = Compare_6989586621679792500Sym1 a6989586621679792498
type Apply (CompareSym0 :: TyFun a6989586621679792381 (a6989586621679792381 ~> Ordering) -> Type) (arg6989586621679792470 :: a6989586621679792381) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Apply (CompareSym0 :: TyFun a6989586621679792381 (a6989586621679792381 ~> Ordering) -> Type) (arg6989586621679792470 :: a6989586621679792381) = CompareSym1 arg6989586621679792470
type Apply (Let6989586621679792586Scrutinee_6989586621679792409Sym0 :: TyFun k1 (TyFun k1 Ordering -> Type) -> Type) (x6989586621679792584 :: k1) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Apply (Let6989586621679792586Scrutinee_6989586621679792409Sym0 :: TyFun k1 (TyFun k1 Ordering -> Type) -> Type) (x6989586621679792584 :: k1) = Let6989586621679792586Scrutinee_6989586621679792409Sym1 x6989586621679792584
type Apply (Let6989586621679792568Scrutinee_6989586621679792407Sym0 :: TyFun k1 (TyFun k1 Ordering -> Type) -> Type) (x6989586621679792566 :: k1) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Apply (Let6989586621679792568Scrutinee_6989586621679792407Sym0 :: TyFun k1 (TyFun k1 Ordering -> Type) -> Type) (x6989586621679792566 :: k1) = Let6989586621679792568Scrutinee_6989586621679792407Sym1 x6989586621679792566
type Apply (Let6989586621679792550Scrutinee_6989586621679792405Sym0 :: TyFun k1 (TyFun k1 Ordering -> Type) -> Type) (x6989586621679792548 :: k1) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Apply (Let6989586621679792550Scrutinee_6989586621679792405Sym0 :: TyFun k1 (TyFun k1 Ordering -> Type) -> Type) (x6989586621679792548 :: k1) = Let6989586621679792550Scrutinee_6989586621679792405Sym1 x6989586621679792548
type Apply (Let6989586621679792532Scrutinee_6989586621679792403Sym0 :: TyFun k1 (TyFun k1 Ordering -> Type) -> Type) (x6989586621679792530 :: k1) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Apply (Let6989586621679792532Scrutinee_6989586621679792403Sym0 :: TyFun k1 (TyFun k1 Ordering -> Type) -> Type) (x6989586621679792530 :: k1) = Let6989586621679792532Scrutinee_6989586621679792403Sym1 x6989586621679792530
type Apply (ComparingSym1 a6989586621679792461 :: TyFun b6989586621679792371 (b6989586621679792371 ~> Ordering) -> Type) (a6989586621679792462 :: b6989586621679792371) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Apply (ComparingSym1 a6989586621679792461 :: TyFun b6989586621679792371 (b6989586621679792371 ~> Ordering) -> Type) (a6989586621679792462 :: b6989586621679792371) = ComparingSym2 a6989586621679792461 a6989586621679792462
type Apply (Compare_6989586621679803239Sym1 a6989586621679803237 :: TyFun [a] Ordering -> Type) (a6989586621679803238 :: [a]) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Apply (Compare_6989586621679803239Sym1 a6989586621679803237 :: TyFun [a] Ordering -> Type) (a6989586621679803238 :: [a]) = Compare_6989586621679803239 a6989586621679803237 a6989586621679803238
type Apply (Compare_6989586621679803207Sym1 a6989586621679803205 :: TyFun (Maybe a) Ordering -> Type) (a6989586621679803206 :: Maybe a) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Apply (Compare_6989586621679803207Sym1 a6989586621679803205 :: TyFun (Maybe a) Ordering -> Type) (a6989586621679803206 :: Maybe a) = Compare_6989586621679803207 a6989586621679803205 a6989586621679803206
type Apply (Compare_6989586621680206703Sym1 a6989586621680206701 :: TyFun (Min a) Ordering -> Type) (a6989586621680206702 :: Min a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (Compare_6989586621680206703Sym1 a6989586621680206701 :: TyFun (Min a) Ordering -> Type) (a6989586621680206702 :: Min a) = Compare_6989586621680206703 a6989586621680206701 a6989586621680206702
type Apply (Compare_6989586621680206724Sym1 a6989586621680206722 :: TyFun (Max a) Ordering -> Type) (a6989586621680206723 :: Max a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (Compare_6989586621680206724Sym1 a6989586621680206722 :: TyFun (Max a) Ordering -> Type) (a6989586621680206723 :: Max a) = Compare_6989586621680206724 a6989586621680206722 a6989586621680206723
type Apply (Compare_6989586621680206745Sym1 a6989586621680206743 :: TyFun (First a) Ordering -> Type) (a6989586621680206744 :: First a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (Compare_6989586621680206745Sym1 a6989586621680206743 :: TyFun (First a) Ordering -> Type) (a6989586621680206744 :: First a) = Compare_6989586621680206745 a6989586621680206743 a6989586621680206744
type Apply (Compare_6989586621680206766Sym1 a6989586621680206764 :: TyFun (Last a) Ordering -> Type) (a6989586621680206765 :: Last a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (Compare_6989586621680206766Sym1 a6989586621680206764 :: TyFun (Last a) Ordering -> Type) (a6989586621680206765 :: Last a) = Compare_6989586621680206766 a6989586621680206764 a6989586621680206765
type Apply (Compare_6989586621680206787Sym1 a6989586621680206785 :: TyFun (WrappedMonoid m) Ordering -> Type) (a6989586621680206786 :: WrappedMonoid m) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (Compare_6989586621680206787Sym1 a6989586621680206785 :: TyFun (WrappedMonoid m) Ordering -> Type) (a6989586621680206786 :: WrappedMonoid m) = Compare_6989586621680206787 a6989586621680206785 a6989586621680206786
type Apply (Compare_6989586621680206583Sym1 a6989586621680206581 :: TyFun (Option a) Ordering -> Type) (a6989586621680206582 :: Option a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (Compare_6989586621680206583Sym1 a6989586621680206581 :: TyFun (Option a) Ordering -> Type) (a6989586621680206582 :: Option a) = Compare_6989586621680206583 a6989586621680206581 a6989586621680206582
type Apply (Compare_6989586621679803706Sym1 a6989586621679803704 :: TyFun (Identity a) Ordering -> Type) (a6989586621679803705 :: Identity a) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Apply (Compare_6989586621679803706Sym1 a6989586621679803704 :: TyFun (Identity a) Ordering -> Type) (a6989586621679803705 :: Identity a) = Compare_6989586621679803706 a6989586621679803704 a6989586621679803705
type Apply (Compare_6989586621680636482Sym1 a6989586621680636480 :: TyFun (First a) Ordering -> Type) (a6989586621680636481 :: First a) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (Compare_6989586621680636482Sym1 a6989586621680636480 :: TyFun (First a) Ordering -> Type) (a6989586621680636481 :: First a) = Compare_6989586621680636482 a6989586621680636480 a6989586621680636481
type Apply (Compare_6989586621680636503Sym1 a6989586621680636501 :: TyFun (Last a) Ordering -> Type) (a6989586621680636502 :: Last a) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (Compare_6989586621680636503Sym1 a6989586621680636501 :: TyFun (Last a) Ordering -> Type) (a6989586621680636502 :: Last a) = Compare_6989586621680636503 a6989586621680636501 a6989586621680636502
type Apply (Compare_6989586621680206604Sym1 a6989586621680206602 :: TyFun (Dual a) Ordering -> Type) (a6989586621680206603 :: Dual a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (Compare_6989586621680206604Sym1 a6989586621680206602 :: TyFun (Dual a) Ordering -> Type) (a6989586621680206603 :: Dual a) = Compare_6989586621680206604 a6989586621680206602 a6989586621680206603
type Apply (Compare_6989586621680206661Sym1 a6989586621680206659 :: TyFun (Sum a) Ordering -> Type) (a6989586621680206660 :: Sum a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (Compare_6989586621680206661Sym1 a6989586621680206659 :: TyFun (Sum a) Ordering -> Type) (a6989586621680206660 :: Sum a) = Compare_6989586621680206661 a6989586621680206659 a6989586621680206660
type Apply (Compare_6989586621680206682Sym1 a6989586621680206680 :: TyFun (Product a) Ordering -> Type) (a6989586621680206681 :: Product a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (Compare_6989586621680206682Sym1 a6989586621680206680 :: TyFun (Product a) Ordering -> Type) (a6989586621680206681 :: Product a) = Compare_6989586621680206682 a6989586621680206680 a6989586621680206681
type Apply (Compare_6989586621679801934Sym1 a6989586621679801932 :: TyFun (Down a) Ordering -> Type) (a6989586621679801933 :: Down a) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Apply (Compare_6989586621679801934Sym1 a6989586621679801932 :: TyFun (Down a) Ordering -> Type) (a6989586621679801933 :: Down a) = Compare_6989586621679801934 a6989586621679801932 a6989586621679801933
type Apply (Compare_6989586621679803314Sym1 a6989586621679803312 :: TyFun (NonEmpty a) Ordering -> Type) (a6989586621679803313 :: NonEmpty a) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Apply (Compare_6989586621679803314Sym1 a6989586621679803312 :: TyFun (NonEmpty a) Ordering -> Type) (a6989586621679803313 :: NonEmpty a) = Compare_6989586621679803314 a6989586621679803312 a6989586621679803313
type Apply (Compare_6989586621679803239Sym0 :: TyFun [a3530822107858468865] ([a3530822107858468865] ~> Ordering) -> Type) (a6989586621679803237 :: [a3530822107858468865]) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Apply (Compare_6989586621679803239Sym0 :: TyFun [a3530822107858468865] ([a3530822107858468865] ~> Ordering) -> Type) (a6989586621679803237 :: [a3530822107858468865]) = Compare_6989586621679803239Sym1 a6989586621679803237
type Apply (Compare_6989586621679803207Sym0 :: TyFun (Maybe a3530822107858468865) (Maybe a3530822107858468865 ~> Ordering) -> Type) (a6989586621679803205 :: Maybe a3530822107858468865) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Apply (Compare_6989586621679803207Sym0 :: TyFun (Maybe a3530822107858468865) (Maybe a3530822107858468865 ~> Ordering) -> Type) (a6989586621679803205 :: Maybe a3530822107858468865) = Compare_6989586621679803207Sym1 a6989586621679803205
type Apply (Compare_6989586621680206703Sym0 :: TyFun (Min a6989586621679060068) (Min a6989586621679060068 ~> Ordering) -> Type) (a6989586621680206701 :: Min a6989586621679060068) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (Compare_6989586621680206703Sym0 :: TyFun (Min a6989586621679060068) (Min a6989586621679060068 ~> Ordering) -> Type) (a6989586621680206701 :: Min a6989586621679060068) = Compare_6989586621680206703Sym1 a6989586621680206701
type Apply (Compare_6989586621680206724Sym0 :: TyFun (Max a6989586621679060073) (Max a6989586621679060073 ~> Ordering) -> Type) (a6989586621680206722 :: Max a6989586621679060073) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (Compare_6989586621680206724Sym0 :: TyFun (Max a6989586621679060073) (Max a6989586621679060073 ~> Ordering) -> Type) (a6989586621680206722 :: Max a6989586621679060073) = Compare_6989586621680206724Sym1 a6989586621680206722
type Apply (Compare_6989586621680206745Sym0 :: TyFun (First a6989586621679060083) (First a6989586621679060083 ~> Ordering) -> Type) (a6989586621680206743 :: First a6989586621679060083) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (Compare_6989586621680206745Sym0 :: TyFun (First a6989586621679060083) (First a6989586621679060083 ~> Ordering) -> Type) (a6989586621680206743 :: First a6989586621679060083) = Compare_6989586621680206745Sym1 a6989586621680206743
type Apply (Compare_6989586621680206766Sym0 :: TyFun (Last a6989586621679060078) (Last a6989586621679060078 ~> Ordering) -> Type) (a6989586621680206764 :: Last a6989586621679060078) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (Compare_6989586621680206766Sym0 :: TyFun (Last a6989586621679060078) (Last a6989586621679060078 ~> Ordering) -> Type) (a6989586621680206764 :: Last a6989586621679060078) = Compare_6989586621680206766Sym1 a6989586621680206764
type Apply (Compare_6989586621680206787Sym0 :: TyFun (WrappedMonoid m6989586621679090730) (WrappedMonoid m6989586621679090730 ~> Ordering) -> Type) (a6989586621680206785 :: WrappedMonoid m6989586621679090730) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (Compare_6989586621680206787Sym0 :: TyFun (WrappedMonoid m6989586621679090730) (WrappedMonoid m6989586621679090730 ~> Ordering) -> Type) (a6989586621680206785 :: WrappedMonoid m6989586621679090730) = Compare_6989586621680206787Sym1 a6989586621680206785
type Apply (Compare_6989586621680206583Sym0 :: TyFun (Option a6989586621679060063) (Option a6989586621679060063 ~> Ordering) -> Type) (a6989586621680206581 :: Option a6989586621679060063) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (Compare_6989586621680206583Sym0 :: TyFun (Option a6989586621679060063) (Option a6989586621679060063 ~> Ordering) -> Type) (a6989586621680206581 :: Option a6989586621679060063) = Compare_6989586621680206583Sym1 a6989586621680206581
type Apply (Compare_6989586621679803706Sym0 :: TyFun (Identity a6989586621679087410) (Identity a6989586621679087410 ~> Ordering) -> Type) (a6989586621679803704 :: Identity a6989586621679087410) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Apply (Compare_6989586621679803706Sym0 :: TyFun (Identity a6989586621679087410) (Identity a6989586621679087410 ~> Ordering) -> Type) (a6989586621679803704 :: Identity a6989586621679087410) = Compare_6989586621679803706Sym1 a6989586621679803704
type Apply (Compare_6989586621680636482Sym0 :: TyFun (First a6989586621679087424) (First a6989586621679087424 ~> Ordering) -> Type) (a6989586621680636480 :: First a6989586621679087424) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (Compare_6989586621680636482Sym0 :: TyFun (First a6989586621679087424) (First a6989586621679087424 ~> Ordering) -> Type) (a6989586621680636480 :: First a6989586621679087424) = Compare_6989586621680636482Sym1 a6989586621680636480
type Apply (Compare_6989586621680636503Sym0 :: TyFun (Last a6989586621679087417) (Last a6989586621679087417 ~> Ordering) -> Type) (a6989586621680636501 :: Last a6989586621679087417) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (Compare_6989586621680636503Sym0 :: TyFun (Last a6989586621679087417) (Last a6989586621679087417 ~> Ordering) -> Type) (a6989586621680636501 :: Last a6989586621679087417) = Compare_6989586621680636503Sym1 a6989586621680636501
type Apply (Compare_6989586621680206604Sym0 :: TyFun (Dual a6989586621679087483) (Dual a6989586621679087483 ~> Ordering) -> Type) (a6989586621680206602 :: Dual a6989586621679087483) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (Compare_6989586621680206604Sym0 :: TyFun (Dual a6989586621679087483) (Dual a6989586621679087483 ~> Ordering) -> Type) (a6989586621680206602 :: Dual a6989586621679087483) = Compare_6989586621680206604Sym1 a6989586621680206602
type Apply (Compare_6989586621680206661Sym0 :: TyFun (Sum a6989586621679087460) (Sum a6989586621679087460 ~> Ordering) -> Type) (a6989586621680206659 :: Sum a6989586621679087460) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (Compare_6989586621680206661Sym0 :: TyFun (Sum a6989586621679087460) (Sum a6989586621679087460 ~> Ordering) -> Type) (a6989586621680206659 :: Sum a6989586621679087460) = Compare_6989586621680206661Sym1 a6989586621680206659
type Apply (Compare_6989586621680206682Sym0 :: TyFun (Product a6989586621679087468) (Product a6989586621679087468 ~> Ordering) -> Type) (a6989586621680206680 :: Product a6989586621679087468) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (Compare_6989586621680206682Sym0 :: TyFun (Product a6989586621679087468) (Product a6989586621679087468 ~> Ordering) -> Type) (a6989586621680206680 :: Product a6989586621679087468) = Compare_6989586621680206682Sym1 a6989586621680206680
type Apply (Compare_6989586621679801934Sym0 :: TyFun (Down a6989586621679801914) (Down a6989586621679801914 ~> Ordering) -> Type) (a6989586621679801932 :: Down a6989586621679801914) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Apply (Compare_6989586621679801934Sym0 :: TyFun (Down a6989586621679801914) (Down a6989586621679801914 ~> Ordering) -> Type) (a6989586621679801932 :: Down a6989586621679801914) = Compare_6989586621679801934Sym1 a6989586621679801932
type Apply (Compare_6989586621679803314Sym0 :: TyFun (NonEmpty a6989586621679060149) (NonEmpty a6989586621679060149 ~> Ordering) -> Type) (a6989586621679803312 :: NonEmpty a6989586621679060149) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Apply (Compare_6989586621679803314Sym0 :: TyFun (NonEmpty a6989586621679060149) (NonEmpty a6989586621679060149 ~> Ordering) -> Type) (a6989586621679803312 :: NonEmpty a6989586621679060149) = Compare_6989586621679803314Sym1 a6989586621679803312
type Apply (Compare_6989586621679803285Sym1 a6989586621679803283 :: TyFun (Either a b) Ordering -> Type) (a6989586621679803284 :: Either a b) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Apply (Compare_6989586621679803285Sym1 a6989586621679803283 :: TyFun (Either a b) Ordering -> Type) (a6989586621679803284 :: Either a b) = Compare_6989586621679803285 a6989586621679803283 a6989586621679803284
type Apply (Compare_6989586621679803356Sym1 a6989586621679803354 :: TyFun (a, b) Ordering -> Type) (a6989586621679803355 :: (a, b)) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Apply (Compare_6989586621679803356Sym1 a6989586621679803354 :: TyFun (a, b) Ordering -> Type) (a6989586621679803355 :: (a, b)) = Compare_6989586621679803356 a6989586621679803354 a6989586621679803355
type Apply (Compare_6989586621681108340Sym1 a6989586621681108338 :: TyFun (Arg a b) Ordering -> Type) (a6989586621681108339 :: Arg a b) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (Compare_6989586621681108340Sym1 a6989586621681108338 :: TyFun (Arg a b) Ordering -> Type) (a6989586621681108339 :: Arg a b) = Compare_6989586621681108340 a6989586621681108338 a6989586621681108339
type Apply (ListsortBySym0 :: TyFun (a6989586621680686806 ~> (a6989586621680686806 ~> Ordering)) ([a6989586621680686806] ~> [a6989586621680686806]) -> Type) (a6989586621680687775 :: a6989586621680686806 ~> (a6989586621680686806 ~> Ordering)) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal.Disambiguation

type Apply (ListsortBySym0 :: TyFun (a6989586621680686806 ~> (a6989586621680686806 ~> Ordering)) ([a6989586621680686806] ~> [a6989586621680686806]) -> Type) (a6989586621680687775 :: a6989586621680686806 ~> (a6989586621680686806 ~> Ordering)) = ListsortBySym1 a6989586621680687775
type Apply (InsertBySym0 :: TyFun (a6989586621680316354 ~> (a6989586621680316354 ~> Ordering)) (a6989586621680316354 ~> ([a6989586621680316354] ~> [a6989586621680316354])) -> Type) (a6989586621680320981 :: a6989586621680316354 ~> (a6989586621680316354 ~> Ordering)) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (InsertBySym0 :: TyFun (a6989586621680316354 ~> (a6989586621680316354 ~> Ordering)) (a6989586621680316354 ~> ([a6989586621680316354] ~> [a6989586621680316354])) -> Type) (a6989586621680320981 :: a6989586621680316354 ~> (a6989586621680316354 ~> Ordering)) = InsertBySym1 a6989586621680320981
type Apply (SortBySym0 :: TyFun (a6989586621680316355 ~> (a6989586621680316355 ~> Ordering)) ([a6989586621680316355] ~> [a6989586621680316355]) -> Type) (a6989586621680321005 :: a6989586621680316355 ~> (a6989586621680316355 ~> Ordering)) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (SortBySym0 :: TyFun (a6989586621680316355 ~> (a6989586621680316355 ~> Ordering)) ([a6989586621680316355] ~> [a6989586621680316355]) -> Type) (a6989586621680321005 :: a6989586621680316355 ~> (a6989586621680316355 ~> Ordering)) = SortBySym1 a6989586621680321005
type Apply (MaximumBySym0 :: TyFun (a6989586621680316353 ~> (a6989586621680316353 ~> Ordering)) ([a6989586621680316353] ~> a6989586621680316353) -> Type) (a6989586621680320951 :: a6989586621680316353 ~> (a6989586621680316353 ~> Ordering)) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (MaximumBySym0 :: TyFun (a6989586621680316353 ~> (a6989586621680316353 ~> Ordering)) ([a6989586621680316353] ~> a6989586621680316353) -> Type) (a6989586621680320951 :: a6989586621680316353 ~> (a6989586621680316353 ~> Ordering)) = MaximumBySym1 a6989586621680320951
type Apply (MinimumBySym0 :: TyFun (a6989586621680316352 ~> (a6989586621680316352 ~> Ordering)) ([a6989586621680316352] ~> a6989586621680316352) -> Type) (a6989586621680320921 :: a6989586621680316352 ~> (a6989586621680316352 ~> Ordering)) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (MinimumBySym0 :: TyFun (a6989586621680316352 ~> (a6989586621680316352 ~> Ordering)) ([a6989586621680316352] ~> a6989586621680316352) -> Type) (a6989586621680320921 :: a6989586621680316352 ~> (a6989586621680316352 ~> Ordering)) = MinimumBySym1 a6989586621680320921
type Apply (Compare_6989586621679803285Sym0 :: TyFun (Either a6989586621679091038 b6989586621679091039) (Either a6989586621679091038 b6989586621679091039 ~> Ordering) -> Type) (a6989586621679803283 :: Either a6989586621679091038 b6989586621679091039) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Apply (Compare_6989586621679803285Sym0 :: TyFun (Either a6989586621679091038 b6989586621679091039) (Either a6989586621679091038 b6989586621679091039 ~> Ordering) -> Type) (a6989586621679803283 :: Either a6989586621679091038 b6989586621679091039) = Compare_6989586621679803285Sym1 a6989586621679803283
type Apply (Compare_6989586621679803356Sym0 :: TyFun (a3530822107858468865, b3530822107858468866) ((a3530822107858468865, b3530822107858468866) ~> Ordering) -> Type) (a6989586621679803354 :: (a3530822107858468865, b3530822107858468866)) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Apply (Compare_6989586621679803356Sym0 :: TyFun (a3530822107858468865, b3530822107858468866) ((a3530822107858468865, b3530822107858468866) ~> Ordering) -> Type) (a6989586621679803354 :: (a3530822107858468865, b3530822107858468866)) = Compare_6989586621679803356Sym1 a6989586621679803354
type Apply (Compare_6989586621681108340Sym0 :: TyFun (Arg a6989586621681107128 b6989586621681107129) (Arg a6989586621681107128 b6989586621681107129 ~> Ordering) -> Type) (a6989586621681108338 :: Arg a6989586621681107128 b6989586621681107129) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (Compare_6989586621681108340Sym0 :: TyFun (Arg a6989586621681107128 b6989586621681107129) (Arg a6989586621681107128 b6989586621681107129 ~> Ordering) -> Type) (a6989586621681108338 :: Arg a6989586621681107128 b6989586621681107129) = Compare_6989586621681108340Sym1 a6989586621681108338
type Apply (Let6989586621680742786Min'Sym0 :: TyFun (k1 ~> (k1 ~> Ordering)) (TyFun k2 (TyFun k1 (TyFun k1 k1 -> Type) -> Type) -> Type) -> Type) (cmp6989586621680742784 :: k1 ~> (k1 ~> Ordering)) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Let6989586621680742786Min'Sym0 :: TyFun (k1 ~> (k1 ~> Ordering)) (TyFun k2 (TyFun k1 (TyFun k1 k1 -> Type) -> Type) -> Type) -> Type) (cmp6989586621680742784 :: k1 ~> (k1 ~> Ordering)) = Let6989586621680742786Min'Sym1 cmp6989586621680742784 :: TyFun k2 (TyFun k1 (TyFun k1 k1 -> Type) -> Type) -> Type
type Apply (Let6989586621680742811Max'Sym0 :: TyFun (k1 ~> (k1 ~> Ordering)) (TyFun k2 (TyFun k1 (TyFun k1 k1 -> Type) -> Type) -> Type) -> Type) (cmp6989586621680742809 :: k1 ~> (k1 ~> Ordering)) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Let6989586621680742811Max'Sym0 :: TyFun (k1 ~> (k1 ~> Ordering)) (TyFun k2 (TyFun k1 (TyFun k1 k1 -> Type) -> Type) -> Type) -> Type) (cmp6989586621680742809 :: k1 ~> (k1 ~> Ordering)) = Let6989586621680742811Max'Sym1 cmp6989586621680742809 :: TyFun k2 (TyFun k1 (TyFun k1 k1 -> Type) -> Type) -> Type
type Apply (MaximumBySym0 :: TyFun (a6989586621680742296 ~> (a6989586621680742296 ~> Ordering)) (t6989586621680742295 a6989586621680742296 ~> a6989586621680742296) -> Type) (a6989586621680742803 :: a6989586621680742296 ~> (a6989586621680742296 ~> Ordering)) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (MaximumBySym0 :: TyFun (a6989586621680742296 ~> (a6989586621680742296 ~> Ordering)) (t6989586621680742295 a6989586621680742296 ~> a6989586621680742296) -> Type) (a6989586621680742803 :: a6989586621680742296 ~> (a6989586621680742296 ~> Ordering)) = MaximumBySym1 a6989586621680742803 t6989586621680742295 :: TyFun (t6989586621680742295 a6989586621680742296) a6989586621680742296 -> Type
type Apply (MinimumBySym0 :: TyFun (a6989586621680742294 ~> (a6989586621680742294 ~> Ordering)) (t6989586621680742293 a6989586621680742294 ~> a6989586621680742294) -> Type) (a6989586621680742778 :: a6989586621680742294 ~> (a6989586621680742294 ~> Ordering)) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (MinimumBySym0 :: TyFun (a6989586621680742294 ~> (a6989586621680742294 ~> Ordering)) (t6989586621680742293 a6989586621680742294 ~> a6989586621680742294) -> Type) (a6989586621680742778 :: a6989586621680742294 ~> (a6989586621680742294 ~> Ordering)) = MinimumBySym1 a6989586621680742778 t6989586621680742293 :: TyFun (t6989586621680742293 a6989586621680742294) a6989586621680742294 -> Type
type Apply (ComparingSym0 :: TyFun (b6989586621679792371 ~> a6989586621679792370) (b6989586621679792371 ~> (b6989586621679792371 ~> Ordering)) -> Type) (a6989586621679792461 :: b6989586621679792371 ~> a6989586621679792370) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Apply (ComparingSym0 :: TyFun (b6989586621679792371 ~> a6989586621679792370) (b6989586621679792371 ~> (b6989586621679792371 ~> Ordering)) -> Type) (a6989586621679792461 :: b6989586621679792371 ~> a6989586621679792370) = ComparingSym1 a6989586621679792461
type Apply (Let6989586621680320932MinBySym0 :: TyFun (k1 ~> (k1 ~> Ordering)) (TyFun k2 (TyFun k3 (TyFun k1 (TyFun k1 k1 -> Type) -> Type) -> Type) -> Type) -> Type) (cmp6989586621680320925 :: k1 ~> (k1 ~> Ordering)) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (Let6989586621680320932MinBySym0 :: TyFun (k1 ~> (k1 ~> Ordering)) (TyFun k2 (TyFun k3 (TyFun k1 (TyFun k1 k1 -> Type) -> Type) -> Type) -> Type) -> Type) (cmp6989586621680320925 :: k1 ~> (k1 ~> Ordering)) = Let6989586621680320932MinBySym1 cmp6989586621680320925 :: TyFun k2 (TyFun k3 (TyFun k1 (TyFun k1 k1 -> Type) -> Type) -> Type) -> Type
type Apply (Let6989586621680320962MaxBySym0 :: TyFun (k1 ~> (k1 ~> Ordering)) (TyFun k2 (TyFun k3 (TyFun k1 (TyFun k1 k1 -> Type) -> Type) -> Type) -> Type) -> Type) (cmp6989586621680320955 :: k1 ~> (k1 ~> Ordering)) 
Instance details

Defined in Data.Singletons.Prelude.List.Internal

type Apply (Let6989586621680320962MaxBySym0 :: TyFun (k1 ~> (k1 ~> Ordering)) (TyFun k2 (TyFun k3 (TyFun k1 (TyFun k1 k1 -> Type) -> Type) -> Type) -> Type) -> Type) (cmp6989586621680320955 :: k1 ~> (k1 ~> Ordering)) = Let6989586621680320962MaxBySym1 cmp6989586621680320955 :: TyFun k2 (TyFun k3 (TyFun k1 (TyFun k1 k1 -> Type) -> Type) -> Type) -> Type
type Apply (Compare_6989586621679803395Sym1 a6989586621679803393 :: TyFun (a, b, c) Ordering -> Type) (a6989586621679803394 :: (a, b, c)) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Apply (Compare_6989586621679803395Sym1 a6989586621679803393 :: TyFun (a, b, c) Ordering -> Type) (a6989586621679803394 :: (a, b, c)) = Compare_6989586621679803395 a6989586621679803393 a6989586621679803394
type Apply (Compare_6989586621680953507Sym1 a6989586621680953505 :: TyFun (Const a b) Ordering -> Type) (a6989586621680953506 :: Const a b) 
Instance details

Defined in Data.Singletons.Prelude.Const

type Apply (Compare_6989586621680953507Sym1 a6989586621680953505 :: TyFun (Const a b) Ordering -> Type) (a6989586621680953506 :: Const a b) = Compare_6989586621680953507 a6989586621680953505 a6989586621680953506
type Apply (Compare_6989586621679803395Sym0 :: TyFun (a3530822107858468865, b3530822107858468866, c3530822107858468867) ((a3530822107858468865, b3530822107858468866, c3530822107858468867) ~> Ordering) -> Type) (a6989586621679803393 :: (a3530822107858468865, b3530822107858468866, c3530822107858468867)) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Apply (Compare_6989586621679803395Sym0 :: TyFun (a3530822107858468865, b3530822107858468866, c3530822107858468867) ((a3530822107858468865, b3530822107858468866, c3530822107858468867) ~> Ordering) -> Type) (a6989586621679803393 :: (a3530822107858468865, b3530822107858468866, c3530822107858468867)) = Compare_6989586621679803395Sym1 a6989586621679803393
type Apply (Compare_6989586621680953507Sym0 :: TyFun (Const a6989586621680952767 b6989586621680952768) (Const a6989586621680952767 b6989586621680952768 ~> Ordering) -> Type) (a6989586621680953505 :: Const a6989586621680952767 b6989586621680952768) 
Instance details

Defined in Data.Singletons.Prelude.Const

type Apply (Compare_6989586621680953507Sym0 :: TyFun (Const a6989586621680952767 b6989586621680952768) (Const a6989586621680952767 b6989586621680952768 ~> Ordering) -> Type) (a6989586621680953505 :: Const a6989586621680952767 b6989586621680952768) = Compare_6989586621680953507Sym1 a6989586621680953505
type Apply (Compare_6989586621679803445Sym1 a6989586621679803443 :: TyFun (a, b, c, d) Ordering -> Type) (a6989586621679803444 :: (a, b, c, d)) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Apply (Compare_6989586621679803445Sym1 a6989586621679803443 :: TyFun (a, b, c, d) Ordering -> Type) (a6989586621679803444 :: (a, b, c, d)) = Compare_6989586621679803445 a6989586621679803443 a6989586621679803444
type Apply (Compare_6989586621679803445Sym0 :: TyFun (a3530822107858468865, b3530822107858468866, c3530822107858468867, d3530822107858468868) ((a3530822107858468865, b3530822107858468866, c3530822107858468867, d3530822107858468868) ~> Ordering) -> Type) (a6989586621679803443 :: (a3530822107858468865, b3530822107858468866, c3530822107858468867, d3530822107858468868)) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Apply (Compare_6989586621679803445Sym0 :: TyFun (a3530822107858468865, b3530822107858468866, c3530822107858468867, d3530822107858468868) ((a3530822107858468865, b3530822107858468866, c3530822107858468867, d3530822107858468868) ~> Ordering) -> Type) (a6989586621679803443 :: (a3530822107858468865, b3530822107858468866, c3530822107858468867, d3530822107858468868)) = Compare_6989586621679803445Sym1 a6989586621679803443
type Apply (Compare_6989586621679803506Sym1 a6989586621679803504 :: TyFun (a, b, c, d, e) Ordering -> Type) (a6989586621679803505 :: (a, b, c, d, e)) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Apply (Compare_6989586621679803506Sym1 a6989586621679803504 :: TyFun (a, b, c, d, e) Ordering -> Type) (a6989586621679803505 :: (a, b, c, d, e)) = Compare_6989586621679803506 a6989586621679803504 a6989586621679803505
type Apply (Compare_6989586621679803506Sym0 :: TyFun (a3530822107858468865, b3530822107858468866, c3530822107858468867, d3530822107858468868, e3530822107858468869) ((a3530822107858468865, b3530822107858468866, c3530822107858468867, d3530822107858468868, e3530822107858468869) ~> Ordering) -> Type) (a6989586621679803504 :: (a3530822107858468865, b3530822107858468866, c3530822107858468867, d3530822107858468868, e3530822107858468869)) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Apply (Compare_6989586621679803506Sym0 :: TyFun (a3530822107858468865, b3530822107858468866, c3530822107858468867, d3530822107858468868, e3530822107858468869) ((a3530822107858468865, b3530822107858468866, c3530822107858468867, d3530822107858468868, e3530822107858468869) ~> Ordering) -> Type) (a6989586621679803504 :: (a3530822107858468865, b3530822107858468866, c3530822107858468867, d3530822107858468868, e3530822107858468869)) = Compare_6989586621679803506Sym1 a6989586621679803504
type Apply (Compare_6989586621679803578Sym1 a6989586621679803576 :: TyFun (a, b, c, d, e, f) Ordering -> Type) (a6989586621679803577 :: (a, b, c, d, e, f)) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Apply (Compare_6989586621679803578Sym1 a6989586621679803576 :: TyFun (a, b, c, d, e, f) Ordering -> Type) (a6989586621679803577 :: (a, b, c, d, e, f)) = Compare_6989586621679803578 a6989586621679803576 a6989586621679803577
type Apply (Compare_6989586621679803578Sym0 :: TyFun (a3530822107858468865, b3530822107858468866, c3530822107858468867, d3530822107858468868, e3530822107858468869, f3530822107858468870) ((a3530822107858468865, b3530822107858468866, c3530822107858468867, d3530822107858468868, e3530822107858468869, f3530822107858468870) ~> Ordering) -> Type) (a6989586621679803576 :: (a3530822107858468865, b3530822107858468866, c3530822107858468867, d3530822107858468868, e3530822107858468869, f3530822107858468870)) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Apply (Compare_6989586621679803578Sym0 :: TyFun (a3530822107858468865, b3530822107858468866, c3530822107858468867, d3530822107858468868, e3530822107858468869, f3530822107858468870) ((a3530822107858468865, b3530822107858468866, c3530822107858468867, d3530822107858468868, e3530822107858468869, f3530822107858468870) ~> Ordering) -> Type) (a6989586621679803576 :: (a3530822107858468865, b3530822107858468866, c3530822107858468867, d3530822107858468868, e3530822107858468869, f3530822107858468870)) = Compare_6989586621679803578Sym1 a6989586621679803576
type Apply (Compare_6989586621679803661Sym1 a6989586621679803659 :: TyFun (a, b, c, d, e, f, g) Ordering -> Type) (a6989586621679803660 :: (a, b, c, d, e, f, g)) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Apply (Compare_6989586621679803661Sym1 a6989586621679803659 :: TyFun (a, b, c, d, e, f, g) Ordering -> Type) (a6989586621679803660 :: (a, b, c, d, e, f, g)) = Compare_6989586621679803661 a6989586621679803659 a6989586621679803660
type Apply (Compare_6989586621679803661Sym0 :: TyFun (a3530822107858468865, b3530822107858468866, c3530822107858468867, d3530822107858468868, e3530822107858468869, f3530822107858468870, g3530822107858468871) ((a3530822107858468865, b3530822107858468866, c3530822107858468867, d3530822107858468868, e3530822107858468869, f3530822107858468870, g3530822107858468871) ~> Ordering) -> Type) (a6989586621679803659 :: (a3530822107858468865, b3530822107858468866, c3530822107858468867, d3530822107858468868, e3530822107858468869, f3530822107858468870, g3530822107858468871)) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Apply (Compare_6989586621679803661Sym0 :: TyFun (a3530822107858468865, b3530822107858468866, c3530822107858468867, d3530822107858468868, e3530822107858468869, f3530822107858468870, g3530822107858468871) ((a3530822107858468865, b3530822107858468866, c3530822107858468867, d3530822107858468868, e3530822107858468869, f3530822107858468870, g3530822107858468871) ~> Ordering) -> Type) (a6989586621679803659 :: (a3530822107858468865, b3530822107858468866, c3530822107858468867, d3530822107858468868, e3530822107858468869, f3530822107858468870, g3530822107858468871)) = Compare_6989586621679803661Sym1 a6989586621679803659

data Ratio a #

Rational numbers, with numerator and denominator of some Integral type.

Note that Ratio's instances inherit the deficiencies from the type parameter's. For example, Ratio Natural's Num instance has similar problems to Natural's.

Constructors

!a :% !a 

Instances

Instances details
NFData1 Ratio

Available on base >=4.9

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

liftRnf :: (a -> ()) -> Ratio a -> () #

Integral a => Enum (Ratio a)

Since: base-2.0.1

Instance details

Defined in GHC.Real

Methods

succ :: Ratio a -> Ratio a #

pred :: Ratio a -> Ratio a #

toEnum :: Int -> Ratio a #

fromEnum :: Ratio a -> Int #

enumFrom :: Ratio a -> [Ratio a] #

enumFromThen :: Ratio a -> Ratio a -> [Ratio a] #

enumFromTo :: Ratio a -> Ratio a -> [Ratio a] #

enumFromThenTo :: Ratio a -> Ratio a -> Ratio a -> [Ratio a] #

Eq a => Eq (Ratio a)

Since: base-2.1

Instance details

Defined in GHC.Real

Methods

(==) :: Ratio a -> Ratio a -> Bool #

(/=) :: Ratio a -> Ratio a -> Bool #

Integral a => Fractional (Ratio a)

Since: base-2.0.1

Instance details

Defined in GHC.Real

Methods

(/) :: Ratio a -> Ratio a -> Ratio a #

recip :: Ratio a -> Ratio a #

fromRational :: Rational -> Ratio a #

(Data a, Integral a) => Data (Ratio a)

Since: base-4.0.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Ratio a -> c (Ratio a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Ratio a) #

toConstr :: Ratio a -> Constr #

dataTypeOf :: Ratio a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Ratio a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Ratio a)) #

gmapT :: (forall b. Data b => b -> b) -> Ratio a -> Ratio a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Ratio a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Ratio a -> r #

gmapQ :: (forall d. Data d => d -> u) -> Ratio a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Ratio a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Ratio a -> m (Ratio a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Ratio a -> m (Ratio a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Ratio a -> m (Ratio a) #

Integral a => Num (Ratio a)

Since: base-2.0.1

Instance details

Defined in GHC.Real

Methods

(+) :: Ratio a -> Ratio a -> Ratio a #

(-) :: Ratio a -> Ratio a -> Ratio a #

(*) :: Ratio a -> Ratio a -> Ratio a #

negate :: Ratio a -> Ratio a #

abs :: Ratio a -> Ratio a #

signum :: Ratio a -> Ratio a #

fromInteger :: Integer -> Ratio a #

Integral a => Ord (Ratio a)

Since: base-2.0.1

Instance details

Defined in GHC.Real

Methods

compare :: Ratio a -> Ratio a -> Ordering #

(<) :: Ratio a -> Ratio a -> Bool #

(<=) :: Ratio a -> Ratio a -> Bool #

(>) :: Ratio a -> Ratio a -> Bool #

(>=) :: Ratio a -> Ratio a -> Bool #

max :: Ratio a -> Ratio a -> Ratio a #

min :: Ratio a -> Ratio a -> Ratio a #

(Integral a, Read a) => Read (Ratio a)

Since: base-2.1

Instance details

Defined in GHC.Read

Integral a => Real (Ratio a)

Since: base-2.0.1

Instance details

Defined in GHC.Real

Methods

toRational :: Ratio a -> Rational #

Integral a => RealFrac (Ratio a)

Since: base-2.0.1

Instance details

Defined in GHC.Real

Methods

properFraction :: Integral b => Ratio a -> (b, Ratio a) #

truncate :: Integral b => Ratio a -> b #

round :: Integral b => Ratio a -> b #

ceiling :: Integral b => Ratio a -> b #

floor :: Integral b => Ratio a -> b #

Show a => Show (Ratio a)

Since: base-2.0.1

Instance details

Defined in GHC.Real

Methods

showsPrec :: Int -> Ratio a -> ShowS #

show :: Ratio a -> String #

showList :: [Ratio a] -> ShowS #

Integral a => Lift (Ratio a) 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

lift :: Ratio a -> Q Exp #

Hashable a => Hashable (Ratio a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Ratio a -> Int #

hash :: Ratio a -> Int #

(Storable a, Integral a) => Storable (Ratio a)

Since: base-4.8.0.0

Instance details

Defined in Foreign.Storable

Methods

sizeOf :: Ratio a -> Int #

alignment :: Ratio a -> Int #

peekElemOff :: Ptr (Ratio a) -> Int -> IO (Ratio a) #

pokeElemOff :: Ptr (Ratio a) -> Int -> Ratio a -> IO () #

peekByteOff :: Ptr b -> Int -> IO (Ratio a) #

pokeByteOff :: Ptr b -> Int -> Ratio a -> IO () #

peek :: Ptr (Ratio a) -> IO (Ratio a) #

poke :: Ptr (Ratio a) -> Ratio a -> IO () #

NFData a => NFData (Ratio a) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Ratio a -> () #

Integral a => Default (Ratio a) 
Instance details

Defined in Data.Default.Class

Methods

def :: Ratio a #

(Eq a) :=> (Eq (Ratio a)) 
Instance details

Defined in Data.Constraint

Methods

ins :: Eq a :- Eq (Ratio a) #

(Integral a) :=> (RealFrac (Ratio a)) 
Instance details

Defined in Data.Constraint

Methods

ins :: Integral a :- RealFrac (Ratio a) #

(Integral a) :=> (Real (Ratio a)) 
Instance details

Defined in Data.Constraint

Methods

ins :: Integral a :- Real (Ratio a) #

(Integral a) :=> (Ord (Ratio a)) 
Instance details

Defined in Data.Constraint

Methods

ins :: Integral a :- Ord (Ratio a) #

(Integral a) :=> (Num (Ratio a)) 
Instance details

Defined in Data.Constraint

Methods

ins :: Integral a :- Num (Ratio a) #

(Integral a) :=> (Fractional (Ratio a)) 
Instance details

Defined in Data.Constraint

Methods

ins :: Integral a :- Fractional (Ratio a) #

(Integral a) :=> (Enum (Ratio a)) 
Instance details

Defined in Data.Constraint

Methods

ins :: Integral a :- Enum (Ratio a) #

(Integral a, Show a) :=> (Show (Ratio a)) 
Instance details

Defined in Data.Constraint

Methods

ins :: (Integral a, Show a) :- Show (Ratio a) #

(Integral a, Read a) :=> (Read (Ratio a)) 
Instance details

Defined in Data.Constraint

Methods

ins :: (Integral a, Read a) :- Read (Ratio a) #

type Rational = Ratio Integer #

Arbitrary-precision rational numbers, represented as a ratio of two Integer values. A rational number may be constructed using the % operator.

data IO a #

A value of type IO a is a computation which, when performed, does some I/O before returning a value of type a.

There is really only one way to "perform" an I/O action: bind it to Main.main in your program. When your program is run, the I/O will be performed. It isn't possible to perform I/O from an arbitrary function, unless that function is itself in the IO monad and called at some point, directly or indirectly, from Main.main.

IO is a monad, so IO actions can be combined using either the do-notation or the >> and >>= operations from the Monad class.

Instances

Instances details
Monad IO

Since: base-2.1

Instance details

Defined in GHC.Base

Methods

(>>=) :: IO a -> (a -> IO b) -> IO b #

(>>) :: IO a -> IO b -> IO b #

return :: a -> IO a #

Functor IO

Since: base-2.1

Instance details

Defined in GHC.Base

Methods

fmap :: (a -> b) -> IO a -> IO b #

(<$) :: a -> IO b -> IO a #

MonadFail IO

Since: base-4.9.0.0

Instance details

Defined in Control.Monad.Fail

Methods

fail :: String -> IO a #

Applicative IO

Since: base-2.1

Instance details

Defined in GHC.Base

Methods

pure :: a -> IO a #

(<*>) :: IO (a -> b) -> IO a -> IO b #

liftA2 :: (a -> b -> c) -> IO a -> IO b -> IO c #

(*>) :: IO a -> IO b -> IO b #

(<*) :: IO a -> IO b -> IO a #

Alternative IO

Since: base-4.9.0.0

Instance details

Defined in GHC.Base

Methods

empty :: IO a #

(<|>) :: IO a -> IO a -> IO a #

some :: IO a -> IO [a] #

many :: IO a -> IO [a] #

MonadPlus IO

Since: base-4.9.0.0

Instance details

Defined in GHC.Base

Methods

mzero :: IO a #

mplus :: IO a -> IO a -> IO a #

MonadIO IO

Since: base-4.9.0.0

Instance details

Defined in Control.Monad.IO.Class

Methods

liftIO :: IO a -> IO a #

PrimMonad IO 
Instance details

Defined in Basement.Monad

Associated Types

type PrimState IO #

type PrimVar IO :: Type -> Type #

Methods

primitive :: (State# (PrimState IO) -> (# State# (PrimState IO), a #)) -> IO a #

primThrow :: Exception e => e -> IO a #

unPrimMonad :: IO a -> State# (PrimState IO) -> (# State# (PrimState IO), a #) #

primVarNew :: a -> IO (PrimVar IO a) #

primVarRead :: PrimVar IO a -> IO a #

primVarWrite :: PrimVar IO a -> a -> IO () #

MonadThrow IO 
Instance details

Defined in Control.Monad.Catch

Methods

throwM :: Exception e => e -> IO a #

MonadCatch IO 
Instance details

Defined in Control.Monad.Catch

Methods

catch :: Exception e => IO a -> (e -> IO a) -> IO a #

MonadMask IO 
Instance details

Defined in Control.Monad.Catch

Methods

mask :: ((forall a. IO a -> IO a) -> IO b) -> IO b #

uninterruptibleMask :: ((forall a. IO a -> IO a) -> IO b) -> IO b #

generalBracket :: IO a -> (a -> ExitCase b -> IO c) -> (a -> IO b) -> IO (b, c) #

PrimMonad IO 
Instance details

Defined in Control.Monad.Primitive

Associated Types

type PrimState IO #

Methods

primitive :: (State# (PrimState IO) -> (# State# (PrimState IO), a #)) -> IO a #

PrimBase IO 
Instance details

Defined in Control.Monad.Primitive

Methods

internal :: IO a -> State# (PrimState IO) -> (# State# (PrimState IO), a #) #

Quasi IO 
Instance details

Defined in Language.Haskell.TH.Syntax

MonadError IOException IO 
Instance details

Defined in Control.Monad.Error.Class

Methods

throwError :: IOException -> IO a #

catchError :: IO a -> (IOException -> IO a) -> IO a #

() :=> (Monad IO) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Monad IO #

() :=> (Functor IO) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Functor IO #

() :=> (Applicative IO) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Applicative IO #

Semigroup a => Semigroup (IO a)

Since: base-4.10.0.0

Instance details

Defined in GHC.Base

Methods

(<>) :: IO a -> IO a -> IO a #

sconcat :: NonEmpty (IO a) -> IO a #

stimes :: Integral b => b -> IO a -> IO 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 #

Default a => Default (IO a) 
Instance details

Defined in Data.Default.Class

Methods

def :: IO a #

IsoHKD IO (a :: Type) 
Instance details

Defined in Data.Vinyl.XRec

Associated Types

type HKD IO a #

Methods

unHKD :: HKD IO a -> IO a #

toHKD :: IO a -> HKD IO a #

(Semigroup a) :=> (Semigroup (IO a)) 
Instance details

Defined in Data.Constraint

Methods

ins :: Semigroup a :- Semigroup (IO a) #

(Monoid a) :=> (Monoid (IO a)) 
Instance details

Defined in Data.Constraint

Methods

ins :: Monoid a :- Monoid (IO a) #

type PrimVar IO 
Instance details

Defined in Basement.Monad

type PrimState IO 
Instance details

Defined in Basement.Monad

type PrimState IO 
Instance details

Defined in Control.Monad.Primitive

type HKD IO (a :: Type) 
Instance details

Defined in Data.Vinyl.XRec

type HKD IO (a :: Type) = IO a

data Word #

A Word is an unsigned integral type, with the same size as Int.

Instances

Instances details
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 #

Data Word

Since: base-4.0.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Word -> c Word #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Word #

toConstr :: Word -> Constr #

dataTypeOf :: Word -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Word) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Word) #

gmapT :: (forall b. Data b => b -> b) -> Word -> Word #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Word -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Word -> r #

gmapQ :: (forall d. Data d => d -> u) -> Word -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Word -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Word -> m Word #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Word -> m Word #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Word -> m Word #

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 #

Lift Word 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

lift :: Word -> Q Exp #

Hashable Word 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Word -> Int #

hash :: Word -> Int #

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

PrimType Word 
Instance details

Defined in Basement.PrimType

Associated Types

type PrimSize Word :: Nat #

PrimMemoryComparable Word 
Instance details

Defined in Basement.PrimType

Subtractive Word 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference Word #

Methods

(-) :: Word -> Word -> Difference Word #

NFData Word 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Word -> () #

Default Word 
Instance details

Defined in Data.Default.Class

Methods

def :: Word #

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

() :=> (Bounded Word) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Bounded Word #

() :=> (Enum Word) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Enum Word #

() :=> (Eq Word) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Eq Word #

() :=> (Integral Word) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Integral Word #

() :=> (Num Word) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Num Word #

() :=> (Ord Word) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Ord Word #

() :=> (Read Word) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Read Word #

() :=> (Real Word) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Real Word #

() :=> (Show Word) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Show Word #

() :=> (Bits Word) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Bits Word #

Generic1 (URec Word :: k -> Type)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Associated Types

type Rep1 (URec Word) :: k -> Type #

Methods

from1 :: forall (a :: k0). URec Word a -> Rep1 (URec Word) a #

to1 :: forall (a :: k0). 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 #

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)

Since: base-4.9.0.0

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 #

type PrimSize Word 
Instance details

Defined in Basement.PrimType

type PrimSize Word = 8
type Difference Word 
Instance details

Defined in Basement.Numerical.Subtractive

type NatNumMaxBound Word 
Instance details

Defined in Basement.Nat

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) 
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) 
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

Instances details
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

Data Word8

Since: base-4.0.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Word8 -> c Word8 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Word8 #

toConstr :: Word8 -> Constr #

dataTypeOf :: Word8 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Word8) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Word8) #

gmapT :: (forall b. Data b => b -> b) -> Word8 -> Word8 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Word8 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Word8 -> r #

gmapQ :: (forall d. Data d => d -> u) -> Word8 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Word8 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Word8 -> m Word8 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Word8 -> m Word8 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Word8 -> m Word8 #

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 #

Hashable Word8 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Word8 -> Int #

hash :: Word8 -> Int #

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

PrimType Word8 
Instance details

Defined in Basement.PrimType

Associated Types

type PrimSize Word8 :: Nat #

PrimMemoryComparable Word8 
Instance details

Defined in Basement.PrimType

Subtractive Word8 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference Word8 #

Methods

(-) :: Word8 -> Word8 -> Difference Word8 #

NFData Word8 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Word8 -> () #

Default Word8 
Instance details

Defined in Data.Default.Class

Methods

def :: Word8 #

Unbox Word8 
Instance details

Defined in Data.Vector.Unboxed.Base

ByteSource Word8 
Instance details

Defined in Data.UUID.Types.Internal.Builder

Methods

(/-/) :: ByteSink Word8 g -> Word8 -> g

Vector Vector Word8 
Instance details

Defined in Data.Vector.Unboxed.Base

MVector MVector Word8 
Instance details

Defined in Data.Vector.Unboxed.Base

type PrimSize Word8 
Instance details

Defined in Basement.PrimType

type PrimSize Word8 = 1
type Difference Word8 
Instance details

Defined in Basement.Numerical.Subtractive

type NatNumMaxBound Word8 
Instance details

Defined in Basement.Nat

newtype Vector Word8 
Instance details

Defined in Data.Vector.Unboxed.Base

type ByteSink Word8 g 
Instance details

Defined in Data.UUID.Types.Internal.Builder

type ByteSink Word8 g = Takes1Byte g
newtype MVector s Word8 
Instance details

Defined in Data.Vector.Unboxed.Base

data Word16 #

16-bit unsigned integer type

Instances

Instances details
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

Data Word16

Since: base-4.0.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Word16 -> c Word16 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Word16 #

toConstr :: Word16 -> Constr #

dataTypeOf :: Word16 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Word16) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Word16) #

gmapT :: (forall b. Data b => b -> b) -> Word16 -> Word16 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Word16 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Word16 -> r #

gmapQ :: (forall d. Data d => d -> u) -> Word16 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Word16 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Word16 -> m Word16 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Word16 -> m Word16 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Word16 -> m Word16 #

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 #

Hashable Word16 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Word16 -> Int #

hash :: Word16 -> Int #

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

PrimType Word16 
Instance details

Defined in Basement.PrimType

Associated Types

type PrimSize Word16 :: Nat #

PrimMemoryComparable Word16 
Instance details

Defined in Basement.PrimType

Subtractive Word16 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference Word16 #

NFData Word16 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Word16 -> () #

Default Word16 
Instance details

Defined in Data.Default.Class

Methods

def :: Word16 #

Unbox Word16 
Instance details

Defined in Data.Vector.Unboxed.Base

ByteSource Word16 
Instance details

Defined in Data.UUID.Types.Internal.Builder

Methods

(/-/) :: ByteSink Word16 g -> Word16 -> g

Vector Vector Word16 
Instance details

Defined in Data.Vector.Unboxed.Base

MVector MVector Word16 
Instance details

Defined in Data.Vector.Unboxed.Base

type PrimSize Word16 
Instance details

Defined in Basement.PrimType

type PrimSize Word16 = 2
type Difference Word16 
Instance details

Defined in Basement.Numerical.Subtractive

type NatNumMaxBound Word16 
Instance details

Defined in Basement.Nat

type NatNumMaxBound Word16 = 65535
newtype Vector Word16 
Instance details

Defined in Data.Vector.Unboxed.Base

type ByteSink Word16 g 
Instance details

Defined in Data.UUID.Types.Internal.Builder

type ByteSink Word16 g = Takes2Bytes g
newtype MVector s Word16 
Instance details

Defined in Data.Vector.Unboxed.Base

data Word32 #

32-bit unsigned integer type

Instances

Instances details
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

Data Word32

Since: base-4.0.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Word32 -> c Word32 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Word32 #

toConstr :: Word32 -> Constr #

dataTypeOf :: Word32 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Word32) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Word32) #

gmapT :: (forall b. Data b => b -> b) -> Word32 -> Word32 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Word32 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Word32 -> r #

gmapQ :: (forall d. Data d => d -> u) -> Word32 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Word32 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Word32 -> m Word32 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Word32 -> m Word32 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Word32 -> m Word32 #

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 #

Hashable Word32 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Word32 -> Int #

hash :: Word32 -> Int #

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

PrimType Word32 
Instance details

Defined in Basement.PrimType

Associated Types

type PrimSize Word32 :: Nat #

PrimMemoryComparable Word32 
Instance details

Defined in Basement.PrimType

Subtractive Word32 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference Word32 #

NFData Word32 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Word32 -> () #

Default Word32 
Instance details

Defined in Data.Default.Class

Methods

def :: Word32 #

Unbox Word32 
Instance details

Defined in Data.Vector.Unboxed.Base

ByteSource Word32 
Instance details

Defined in Data.UUID.Types.Internal.Builder

Methods

(/-/) :: ByteSink Word32 g -> Word32 -> g

Vector Vector Word32 
Instance details

Defined in Data.Vector.Unboxed.Base

MVector MVector Word32 
Instance details

Defined in Data.Vector.Unboxed.Base

type PrimSize Word32 
Instance details

Defined in Basement.PrimType

type PrimSize Word32 = 4
type Difference Word32 
Instance details

Defined in Basement.Numerical.Subtractive

type NatNumMaxBound Word32 
Instance details

Defined in Basement.Nat

type NatNumMaxBound Word32 = 4294967295
newtype Vector Word32 
Instance details

Defined in Data.Vector.Unboxed.Base

type ByteSink Word32 g 
Instance details

Defined in Data.UUID.Types.Internal.Builder

type ByteSink Word32 g = Takes4Bytes g
newtype MVector s Word32 
Instance details

Defined in Data.Vector.Unboxed.Base

data Word64 #

64-bit unsigned integer type

Instances

Instances details
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

Data Word64

Since: base-4.0.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Word64 -> c Word64 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Word64 #

toConstr :: Word64 -> Constr #

dataTypeOf :: Word64 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Word64) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Word64) #

gmapT :: (forall b. Data b => b -> b) -> Word64 -> Word64 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Word64 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Word64 -> r #

gmapQ :: (forall d. Data d => d -> u) -> Word64 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Word64 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Word64 -> m Word64 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Word64 -> m Word64 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Word64 -> m Word64 #

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 #

Hashable Word64 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Word64 -> Int #

hash :: Word64 -> Int #

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

PrimType Word64 
Instance details

Defined in Basement.PrimType

Associated Types

type PrimSize Word64 :: Nat #

PrimMemoryComparable Word64 
Instance details

Defined in Basement.PrimType

Subtractive Word64 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference Word64 #

NFData Word64 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Word64 -> () #

Default Word64 
Instance details

Defined in Data.Default.Class

Methods

def :: Word64 #

Unbox Word64 
Instance details

Defined in Data.Vector.Unboxed.Base

Vector Vector Word64 
Instance details

Defined in Data.Vector.Unboxed.Base

MVector MVector Word64 
Instance details

Defined in Data.Vector.Unboxed.Base

type PrimSize Word64 
Instance details

Defined in Basement.PrimType

type PrimSize Word64 = 8
type Difference Word64 
Instance details

Defined in Basement.Numerical.Subtractive

type NatNumMaxBound Word64 
Instance details

Defined in Basement.Nat

type NatNumMaxBound Word64 = 18446744073709551615
newtype Vector Word64 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype MVector s Word64 
Instance details

Defined in Data.Vector.Unboxed.Base

data Ptr a #

A value of type Ptr a represents a pointer to an object, or an array of objects, which may be marshalled to or from Haskell values of type a.

The type a will often be an instance of class Storable which provides the marshalling operations. However this is not essential, and you can provide your own operations to access the pointer. For example you might write small foreign functions to get or set the fields of a C struct.

Instances

Instances details
NFData1 Ptr

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

liftRnf :: (a -> ()) -> Ptr a -> () #

Generic1 (URec (Ptr ()) :: k -> Type)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Associated Types

type Rep1 (URec (Ptr ())) :: k -> Type #

Methods

from1 :: forall (a :: k0). URec (Ptr ()) a -> Rep1 (URec (Ptr ())) a #

to1 :: forall (a :: k0). Rep1 (URec (Ptr ())) a -> URec (Ptr ()) a #

Eq (Ptr a)

Since: base-2.1

Instance details

Defined in GHC.Ptr

Methods

(==) :: Ptr a -> Ptr a -> Bool #

(/=) :: Ptr a -> Ptr a -> Bool #

Data a => Data (Ptr a)

Since: base-4.8.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Ptr a -> c (Ptr a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Ptr a) #

toConstr :: Ptr a -> Constr #

dataTypeOf :: Ptr a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Ptr a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Ptr a)) #

gmapT :: (forall b. Data b => b -> b) -> Ptr a -> Ptr a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Ptr a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Ptr a -> r #

gmapQ :: (forall d. Data d => d -> u) -> Ptr a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Ptr a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Ptr a -> m (Ptr a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Ptr a -> m (Ptr a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Ptr a -> m (Ptr a) #

Ord (Ptr a)

Since: base-2.1

Instance details

Defined in GHC.Ptr

Methods

compare :: Ptr a -> Ptr a -> Ordering #

(<) :: Ptr a -> Ptr a -> Bool #

(<=) :: Ptr a -> Ptr a -> Bool #

(>) :: Ptr a -> Ptr a -> Bool #

(>=) :: Ptr a -> Ptr a -> Bool #

max :: Ptr a -> Ptr a -> Ptr a #

min :: Ptr a -> Ptr a -> Ptr a #

Show (Ptr a)

Since: base-2.1

Instance details

Defined in GHC.Ptr

Methods

showsPrec :: Int -> Ptr a -> ShowS #

show :: Ptr a -> String #

showList :: [Ptr a] -> ShowS #

Hashable (Ptr a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Ptr a -> Int #

hash :: Ptr a -> Int #

Storable (Ptr a)

Since: base-2.1

Instance details

Defined in Foreign.Storable

Methods

sizeOf :: Ptr a -> Int #

alignment :: Ptr a -> Int #

peekElemOff :: Ptr (Ptr a) -> Int -> IO (Ptr a) #

pokeElemOff :: Ptr (Ptr a) -> Int -> Ptr a -> IO () #

peekByteOff :: Ptr b -> Int -> IO (Ptr a) #

pokeByteOff :: Ptr b -> Int -> Ptr a -> IO () #

peek :: Ptr (Ptr a) -> IO (Ptr a) #

poke :: Ptr (Ptr a) -> Ptr a -> IO () #

NFData (Ptr a)

Since: deepseq-1.4.2.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Ptr a -> () #

Functor (URec (Ptr ()) :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

fmap :: (a -> b) -> URec (Ptr ()) a -> URec (Ptr ()) b #

(<$) :: a -> URec (Ptr ()) b -> URec (Ptr ()) a #

Foldable (URec (Ptr ()) :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => URec (Ptr ()) m -> m #

foldMap :: Monoid m => (a -> m) -> URec (Ptr ()) a -> m #

foldMap' :: Monoid m => (a -> m) -> URec (Ptr ()) a -> m #

foldr :: (a -> b -> b) -> b -> URec (Ptr ()) a -> b #

foldr' :: (a -> b -> b) -> b -> URec (Ptr ()) a -> b #

foldl :: (b -> a -> b) -> b -> URec (Ptr ()) a -> b #

foldl' :: (b -> a -> b) -> b -> URec (Ptr ()) a -> b #

foldr1 :: (a -> a -> a) -> URec (Ptr ()) a -> a #

foldl1 :: (a -> a -> a) -> URec (Ptr ()) a -> a #

toList :: URec (Ptr ()) a -> [a] #

null :: URec (Ptr ()) a -> Bool #

length :: URec (Ptr ()) a -> Int #

elem :: Eq a => a -> URec (Ptr ()) a -> Bool #

maximum :: Ord a => URec (Ptr ()) a -> a #

minimum :: Ord a => URec (Ptr ()) a -> a #

sum :: Num a => URec (Ptr ()) a -> a #

product :: Num a => URec (Ptr ()) a -> a #

Traversable (URec (Ptr ()) :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> URec (Ptr ()) a -> f (URec (Ptr ()) b) #

sequenceA :: Applicative f => URec (Ptr ()) (f a) -> f (URec (Ptr ()) a) #

mapM :: Monad m => (a -> m b) -> URec (Ptr ()) a -> m (URec (Ptr ()) b) #

sequence :: Monad m => URec (Ptr ()) (m a) -> m (URec (Ptr ()) a) #

Eq (URec (Ptr ()) p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

(==) :: URec (Ptr ()) p -> URec (Ptr ()) p -> Bool #

(/=) :: URec (Ptr ()) p -> URec (Ptr ()) p -> Bool #

Ord (URec (Ptr ()) p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

compare :: URec (Ptr ()) p -> URec (Ptr ()) p -> Ordering #

(<) :: URec (Ptr ()) p -> URec (Ptr ()) p -> Bool #

(<=) :: URec (Ptr ()) p -> URec (Ptr ()) p -> Bool #

(>) :: URec (Ptr ()) p -> URec (Ptr ()) p -> Bool #

(>=) :: URec (Ptr ()) p -> URec (Ptr ()) p -> Bool #

max :: URec (Ptr ()) p -> URec (Ptr ()) p -> URec (Ptr ()) p #

min :: URec (Ptr ()) p -> URec (Ptr ()) p -> URec (Ptr ()) p #

Generic (URec (Ptr ()) p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Associated Types

type Rep (URec (Ptr ()) p) :: Type -> Type #

Methods

from :: URec (Ptr ()) p -> Rep (URec (Ptr ()) p) x #

to :: Rep (URec (Ptr ()) p) x -> URec (Ptr ()) p #

data URec (Ptr ()) (p :: k)

Used for marking occurrences of Addr#

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

data URec (Ptr ()) (p :: k) = UAddr {}
type Rep1 (URec (Ptr ()) :: k -> Type) 
Instance details

Defined in GHC.Generics

type Rep1 (URec (Ptr ()) :: k -> Type) = D1 ('MetaData "URec" "GHC.Generics" "base" 'False) (C1 ('MetaCons "UAddr" 'PrefixI 'True) (S1 ('MetaSel ('Just "uAddr#") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (UAddr :: k -> Type)))
type Rep (URec (Ptr ()) p) 
Instance details

Defined in GHC.Generics

type Rep (URec (Ptr ()) p) = D1 ('MetaData "URec" "GHC.Generics" "base" 'False) (C1 ('MetaCons "UAddr" 'PrefixI 'True) (S1 ('MetaSel ('Just "uAddr#") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (UAddr :: Type -> Type)))

data FunPtr a #

A value of type FunPtr a is a pointer to a function callable from foreign code. The type a will normally be a foreign type, a function type with zero or more arguments where

A value of type FunPtr a may be a pointer to a foreign function, either returned by another foreign function or imported with a a static address import like

foreign import ccall "stdlib.h &free"
  p_free :: FunPtr (Ptr a -> IO ())

or a pointer to a Haskell function created using a wrapper stub declared to produce a FunPtr of the correct type. For example:

type Compare = Int -> Int -> Bool
foreign import ccall "wrapper"
  mkCompare :: Compare -> IO (FunPtr Compare)

Calls to wrapper stubs like mkCompare allocate storage, which should be released with freeHaskellFunPtr when no longer required.

To convert FunPtr values to corresponding Haskell functions, one can define a dynamic stub for the specific foreign type, e.g.

type IntFunction = CInt -> IO ()
foreign import ccall "dynamic"
  mkFun :: FunPtr IntFunction -> IntFunction

Instances

Instances details
NFData1 FunPtr

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

liftRnf :: (a -> ()) -> FunPtr a -> () #

Eq (FunPtr a) 
Instance details

Defined in GHC.Ptr

Methods

(==) :: FunPtr a -> FunPtr a -> Bool #

(/=) :: FunPtr a -> FunPtr a -> Bool #

Ord (FunPtr a) 
Instance details

Defined in GHC.Ptr

Methods

compare :: FunPtr a -> FunPtr a -> Ordering #

(<) :: FunPtr a -> FunPtr a -> Bool #

(<=) :: FunPtr a -> FunPtr a -> Bool #

(>) :: FunPtr a -> FunPtr a -> Bool #

(>=) :: FunPtr a -> FunPtr a -> Bool #

max :: FunPtr a -> FunPtr a -> FunPtr a #

min :: FunPtr a -> FunPtr a -> FunPtr a #

Show (FunPtr a)

Since: base-2.1

Instance details

Defined in GHC.Ptr

Methods

showsPrec :: Int -> FunPtr a -> ShowS #

show :: FunPtr a -> String #

showList :: [FunPtr a] -> ShowS #

Hashable (FunPtr a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> FunPtr a -> Int #

hash :: FunPtr a -> Int #

Storable (FunPtr a)

Since: base-2.1

Instance details

Defined in Foreign.Storable

Methods

sizeOf :: FunPtr a -> Int #

alignment :: FunPtr a -> Int #

peekElemOff :: Ptr (FunPtr a) -> Int -> IO (FunPtr a) #

pokeElemOff :: Ptr (FunPtr a) -> Int -> FunPtr a -> IO () #

peekByteOff :: Ptr b -> Int -> IO (FunPtr a) #

pokeByteOff :: Ptr b -> Int -> FunPtr a -> IO () #

peek :: Ptr (FunPtr a) -> IO (FunPtr a) #

poke :: Ptr (FunPtr a) -> FunPtr a -> IO () #

NFData (FunPtr a)

Since: deepseq-1.4.2.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: FunPtr a -> () #

data Either a b #

The Either type represents values with two possibilities: a value of type Either a b is either Left a or Right b.

The Either type is sometimes used to represent a value which is either correct or an error; by convention, the Left constructor is used to hold an error value and the Right constructor is used to hold a correct value (mnemonic: "right" also means "correct").

Examples

Expand

The type Either String Int is the type of values which can be either a String or an Int. The Left constructor can be used only on Strings, and the Right constructor can be used only on Ints:

>>> let s = Left "foo" :: Either String Int
>>> s
Left "foo"
>>> let n = Right 3 :: Either String Int
>>> n
Right 3
>>> :type s
s :: Either String Int
>>> :type n
n :: Either String Int

The fmap from our Functor instance will ignore Left values, but will apply the supplied function to values contained in a Right:

>>> let s = Left "foo" :: Either String Int
>>> let n = Right 3 :: Either String Int
>>> fmap (*2) s
Left "foo"
>>> fmap (*2) n
Right 6

The Monad instance for Either allows us to chain together multiple actions which may fail, and fail overall if any of the individual steps failed. First we'll write a function that can either parse an Int from a Char, or fail.

>>> import Data.Char ( digitToInt, isDigit )
>>> :{
    let parseEither :: Char -> Either String Int
        parseEither c
          | isDigit c = Right (digitToInt c)
          | otherwise = Left "parse error"
>>> :}

The following should work, since both '1' and '2' can be parsed as Ints.

>>> :{
    let parseMultiple :: Either String Int
        parseMultiple = do
          x <- parseEither '1'
          y <- parseEither '2'
          return (x + y)
>>> :}
>>> parseMultiple
Right 3

But the following should fail overall, since the first operation where we attempt to parse 'm' as an Int will fail:

>>> :{
    let parseMultiple :: Either String Int
        parseMultiple = do
          x <- parseEither 'm'
          y <- parseEither '2'
          return (x + y)
>>> :}
>>> parseMultiple
Left "parse error"

Constructors

Left a 
Right b 

Instances

Instances details
Bifunctor Either

Since: base-4.8.0.0

Instance details

Defined in Data.Bifunctor

Methods

bimap :: (a -> b) -> (c -> d) -> Either a c -> Either b d #

first :: (a -> b) -> Either a c -> Either b c #

second :: (b -> c) -> Either a b -> Either a c #

NFData2 Either

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

liftRnf2 :: (a -> ()) -> (b -> ()) -> Either a b -> () #

Hashable2 Either 
Instance details

Defined in Data.Hashable.Class

Methods

liftHashWithSalt2 :: (Int -> a -> Int) -> (Int -> b -> Int) -> Int -> Either a b -> Int #

() :=> (Monad (Either a)) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Monad (Either a) #

() :=> (Functor (Either a)) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Functor (Either a) #

() :=> (Applicative (Either a)) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Applicative (Either a) #

MonadError e (Either e) 
Instance details

Defined in Control.Monad.Error.Class

Methods

throwError :: e -> Either e a #

catchError :: Either e a -> (e -> Either e a) -> Either e a #

Monad (Either e)

Since: base-4.4.0.0

Instance details

Defined in Data.Either

Methods

(>>=) :: Either e a -> (a -> Either e b) -> Either e b #

(>>) :: Either e a -> Either e b -> Either e b #

return :: a -> Either e a #

Functor (Either a)

Since: base-3.0

Instance details

Defined in Data.Either

Methods

fmap :: (a0 -> b) -> Either a a0 -> Either a b #

(<$) :: a0 -> Either a b -> Either a a0 #

Applicative (Either e)

Since: base-3.0

Instance details

Defined in Data.Either

Methods

pure :: a -> Either e a #

(<*>) :: Either e (a -> b) -> Either e a -> Either e b #

liftA2 :: (a -> b -> c) -> Either e a -> Either e b -> Either e c #

(*>) :: Either e a -> Either e b -> Either e b #

(<*) :: Either e a -> Either e b -> Either e a #

Foldable (Either a)

Since: base-4.7.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => Either a m -> m #

foldMap :: Monoid m => (a0 -> m) -> Either a a0 -> m #

foldMap' :: Monoid m => (a0 -> m) -> Either a a0 -> m #

foldr :: (a0 -> b -> b) -> b -> Either a a0 -> b #

foldr' :: (a0 -> b -> b) -> b -> Either a a0 -> b #

foldl :: (b -> a0 -> b) -> b -> Either a a0 -> b #

foldl' :: (b -> a0 -> b) -> b -> Either a a0 -> b #

foldr1 :: (a0 -> a0 -> a0) -> Either a a0 -> a0 #

foldl1 :: (a0 -> a0 -> a0) -> Either a a0 -> a0 #

toList :: Either a a0 -> [a0] #

null :: Either a a0 -> Bool #

length :: Either a a0 -> Int #

elem :: Eq a0 => a0 -> Either a a0 -> Bool #

maximum :: Ord a0 => Either a a0 -> a0 #

minimum :: Ord a0 => Either a a0 -> a0 #

sum :: Num a0 => Either a a0 -> a0 #

product :: Num a0 => Either a a0 -> a0 #

Traversable (Either a)

Since: base-4.7.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a0 -> f b) -> Either a a0 -> f (Either a b) #

sequenceA :: Applicative f => Either a (f a0) -> f (Either a a0) #

mapM :: Monad m => (a0 -> m b) -> Either a a0 -> m (Either a b) #

sequence :: Monad m => Either a (m a0) -> m (Either a a0) #

MonadFailure (Either a) 
Instance details

Defined in Basement.Monad

Associated Types

type Failure (Either a) #

Methods

mFail :: Failure (Either a) -> Either a () #

NFData a => NFData1 (Either a)

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

liftRnf :: (a0 -> ()) -> Either a a0 -> () #

e ~ SomeException => MonadThrow (Either e) 
Instance details

Defined in Control.Monad.Catch

Methods

throwM :: Exception e0 => e0 -> Either e a #

e ~ SomeException => MonadCatch (Either e)

Since: exceptions-0.8.3

Instance details

Defined in Control.Monad.Catch

Methods

catch :: Exception e0 => Either e a -> (e0 -> Either e a) -> Either e a #

e ~ SomeException => MonadMask (Either e)

Since: exceptions-0.8.3

Instance details

Defined in Control.Monad.Catch

Methods

mask :: ((forall a. Either e a -> Either e a) -> Either e b) -> Either e b #

uninterruptibleMask :: ((forall a. Either e a -> Either e a) -> Either e b) -> Either e b #

generalBracket :: Either e a -> (a -> ExitCase b -> Either e c) -> (a -> Either e b) -> Either e (b, c) #

Hashable a => Hashable1 (Either a) 
Instance details

Defined in Data.Hashable.Class

Methods

liftHashWithSalt :: (Int -> a0 -> Int) -> Int -> Either a a0 -> Int #

PTraversable (Either a) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

Associated Types

type Traverse arg0 arg1 :: f0 (t0 b0) #

type SequenceA arg0 :: f0 (t0 a0) #

type MapM arg0 arg1 :: m0 (t0 b0) #

type Sequence arg0 :: m0 (t0 a0) #

STraversable (Either a) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

Methods

sTraverse :: forall a0 (f :: Type -> Type) b (t1 :: a0 ~> f b) (t2 :: Either a a0). SApplicative f => Sing t1 -> Sing t2 -> Sing (Apply (Apply TraverseSym0 t1) t2) #

sSequenceA :: forall (f :: Type -> Type) a0 (t :: Either a (f a0)). SApplicative f => Sing t -> Sing (Apply SequenceASym0 t) #

sMapM :: forall a0 (m :: Type -> Type) b (t1 :: a0 ~> m b) (t2 :: Either a a0). SMonad m => Sing t1 -> Sing t2 -> Sing (Apply (Apply MapMSym0 t1) t2) #

sSequence :: forall (m :: Type -> Type) a0 (t :: Either a (m a0)). SMonad m => Sing t -> Sing (Apply SequenceSym0 t) #

PFoldable (Either a) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

Associated Types

type Fold arg0 :: m0 #

type FoldMap arg0 arg1 :: m0 #

type Foldr arg0 arg1 arg2 :: b0 #

type Foldr' arg0 arg1 arg2 :: b0 #

type Foldl arg0 arg1 arg2 :: b0 #

type Foldl' arg0 arg1 arg2 :: b0 #

type Foldr1 arg0 arg1 :: a0 #

type Foldl1 arg0 arg1 :: a0 #

type ToList arg0 :: [a0] #

type Null arg0 :: Bool #

type Length arg0 :: Nat #

type Elem arg0 arg1 :: Bool #

type Maximum arg0 :: a0 #

type Minimum arg0 :: a0 #

type Sum arg0 :: a0 #

type Product arg0 :: a0 #

SFoldable (Either a) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

Methods

sFold :: forall m (t :: Either a m). SMonoid m => Sing t -> Sing (Apply FoldSym0 t) #

sFoldMap :: forall a0 m (t1 :: a0 ~> m) (t2 :: Either a a0). SMonoid m => Sing t1 -> Sing t2 -> Sing (Apply (Apply FoldMapSym0 t1) t2) #

sFoldr :: forall a0 b (t1 :: a0 ~> (b ~> b)) (t2 :: b) (t3 :: Either a a0). Sing t1 -> Sing t2 -> Sing t3 -> Sing (Apply (Apply (Apply FoldrSym0 t1) t2) t3) #

sFoldr' :: forall a0 b (t1 :: a0 ~> (b ~> b)) (t2 :: b) (t3 :: Either a a0). Sing t1 -> Sing t2 -> Sing t3 -> Sing (Apply (Apply (Apply Foldr'Sym0 t1) t2) t3) #

sFoldl :: forall b a0 (t1 :: b ~> (a0 ~> b)) (t2 :: b) (t3 :: Either a a0). Sing t1 -> Sing t2 -> Sing t3 -> Sing (Apply (Apply (Apply FoldlSym0 t1) t2) t3) #

sFoldl' :: forall b a0 (t1 :: b ~> (a0 ~> b)) (t2 :: b) (t3 :: Either a a0). Sing t1 -> Sing t2 -> Sing t3 -> Sing (Apply (Apply (Apply Foldl'Sym0 t1) t2) t3) #

sFoldr1 :: forall a0 (t1 :: a0 ~> (a0 ~> a0)) (t2 :: Either a a0). Sing t1 -> Sing t2 -> Sing (Apply (Apply Foldr1Sym0 t1) t2) #

sFoldl1 :: forall a0 (t1 :: a0 ~> (a0 ~> a0)) (t2 :: Either a a0). Sing t1 -> Sing t2 -> Sing (Apply (Apply Foldl1Sym0 t1) t2) #

sToList :: forall a0 (t :: Either a a0). Sing t -> Sing (Apply ToListSym0 t) #

sNull :: forall a0 (t :: Either a a0). Sing t -> Sing (Apply NullSym0 t) #

sLength :: forall a0 (t :: Either a a0). Sing t -> Sing (Apply LengthSym0 t) #

sElem :: forall a0 (t1 :: a0) (t2 :: Either a a0). SEq a0 => Sing t1 -> Sing t2 -> Sing (Apply (Apply ElemSym0 t1) t2) #

sMaximum :: forall a0 (t :: Either a a0). SOrd a0 => Sing t -> Sing (Apply MaximumSym0 t) #

sMinimum :: forall a0 (t :: Either a a0). SOrd a0 => Sing t -> Sing (Apply MinimumSym0 t) #

sSum :: forall a0 (t :: Either a a0). SNum a0 => Sing t -> Sing (Apply SumSym0 t) #

sProduct :: forall a0 (t :: Either a a0). SNum a0 => Sing t -> Sing (Apply ProductSym0 t) #

PFunctor (Either a) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

Associated Types

type Fmap arg0 arg1 :: f0 b0 #

type arg0 <$ arg1 :: f0 a0 #

PApplicative (Either e) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

Associated Types

type Pure arg0 :: f0 a0 #

type arg0 <*> arg1 :: f0 b0 #

type LiftA2 arg0 arg1 arg2 :: f0 c0 #

type arg0 *> arg1 :: f0 b0 #

type arg0 <* arg1 :: f0 a0 #

PMonad (Either e) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

Associated Types

type arg0 >>= arg1 :: m0 b0 #

type arg0 >> arg1 :: m0 b0 #

type Return arg0 :: m0 a0 #

SFunctor (Either a) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

Methods

sFmap :: forall a0 b (t1 :: a0 ~> b) (t2 :: Either a a0). Sing t1 -> Sing t2 -> Sing (Apply (Apply FmapSym0 t1) t2) #

(%<$) :: forall a0 b (t1 :: a0) (t2 :: Either a b). Sing t1 -> Sing t2 -> Sing (Apply (Apply (<$@#@$) t1) t2) #

SApplicative (Either e) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

Methods

sPure :: forall a (t :: a). Sing t -> Sing (Apply PureSym0 t) #

(%<*>) :: forall a b (t1 :: Either e (a ~> b)) (t2 :: Either e a). Sing t1 -> Sing t2 -> Sing (Apply (Apply (<*>@#@$) t1) t2) #

sLiftA2 :: forall a b c (t1 :: a ~> (b ~> c)) (t2 :: Either e a) (t3 :: Either e b). Sing t1 -> Sing t2 -> Sing t3 -> Sing (Apply (Apply (Apply LiftA2Sym0 t1) t2) t3) #

(%*>) :: forall a b (t1 :: Either e a) (t2 :: Either e b). Sing t1 -> Sing t2 -> Sing (Apply (Apply (*>@#@$) t1) t2) #

(%<*) :: forall a b (t1 :: Either e a) (t2 :: Either e b). Sing t1 -> Sing t2 -> Sing (Apply (Apply (<*@#@$) t1) t2) #

SMonad (Either e) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

Methods

(%>>=) :: forall a b (t1 :: Either e a) (t2 :: a ~> Either e b). Sing t1 -> Sing t2 -> Sing (Apply (Apply (>>=@#@$) t1) t2) #

(%>>) :: forall a b (t1 :: Either e a) (t2 :: Either e b). Sing t1 -> Sing t2 -> Sing (Apply (Apply (>>@#@$) t1) t2) #

sReturn :: forall a (t :: a). Sing t -> Sing (Apply ReturnSym0 t) #

Generic1 (Either a :: Type -> Type)

Since: base-4.6.0.0

Instance details

Defined in GHC.Generics

Associated Types

type Rep1 (Either a) :: k -> Type #

Methods

from1 :: forall (a0 :: k). Either a a0 -> Rep1 (Either a) a0 #

to1 :: forall (a0 :: k). Rep1 (Either a) a0 -> Either a a0 #

IsoHKD (Either a :: Type -> Type) (b :: Type) 
Instance details

Defined in Data.Vinyl.XRec

Associated Types

type HKD (Either a) b #

Methods

unHKD :: HKD (Either a) b -> Either a b #

toHKD :: Either a b -> HKD (Either a) b #

(CanCastTo l1 l2, CanCastTo r1 r2) => CanCastTo (Either l1 r1 :: Type) (Either l2 r2 :: Type) 
Instance details

Defined in Lorentz.Coercions

Methods

castDummy :: Proxy (Either l1 r1) -> Proxy (Either l2 r2) -> () #

(Eq a, Eq b) => Eq (Either a b)

Since: base-2.1

Instance details

Defined in Data.Either

Methods

(==) :: Either a b -> Either a b -> Bool #

(/=) :: Either a b -> Either a b -> Bool #

(Data a, Data b) => Data (Either a b)

Since: base-4.0.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b0. Data d => c (d -> b0) -> d -> c b0) -> (forall g. g -> c g) -> Either a b -> c (Either a b) #

gunfold :: (forall b0 r. Data b0 => c (b0 -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Either a b) #

toConstr :: Either a b -> Constr #

dataTypeOf :: Either a b -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Either a b)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Either a b)) #

gmapT :: (forall b0. Data b0 => b0 -> b0) -> Either a b -> Either a b #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Either a b -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Either a b -> r #

gmapQ :: (forall d. Data d => d -> u) -> Either a b -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Either a b -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Either a b -> m (Either a b) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Either a b -> m (Either a b) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Either a b -> m (Either a b) #

(Ord a, Ord b) => Ord (Either a b)

Since: base-2.1

Instance details

Defined in Data.Either

Methods

compare :: Either a b -> Either a b -> Ordering #

(<) :: Either a b -> Either a b -> Bool #

(<=) :: Either a b -> Either a b -> Bool #

(>) :: Either a b -> Either a b -> Bool #

(>=) :: Either a b -> Either a b -> Bool #

max :: Either a b -> Either a b -> Either a b #

min :: Either a b -> Either a b -> Either a b #

(Read a, Read b) => Read (Either a b)

Since: base-3.0

Instance details

Defined in Data.Either

(Show a, Show b) => Show (Either a b)

Since: base-3.0

Instance details

Defined in Data.Either

Methods

showsPrec :: Int -> Either a b -> ShowS #

show :: Either a b -> String #

showList :: [Either a b] -> ShowS #

Generic (Either a b)

Since: base-4.6.0.0

Instance details

Defined in GHC.Generics

Associated Types

type Rep (Either a b) :: Type -> Type #

Methods

from :: Either a b -> Rep (Either a b) x #

to :: Rep (Either a b) x -> Either a b #

Semigroup (Either a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Either

Methods

(<>) :: Either a b -> Either a b -> Either a b #

sconcat :: NonEmpty (Either a b) -> Either a b #

stimes :: Integral b0 => b0 -> Either a b -> Either a b #

(Lift a, Lift b) => Lift (Either a b) 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

lift :: Either a b -> Q Exp #

(Hashable a, Hashable b) => Hashable (Either a b) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Either a b -> Int #

hash :: Either a b -> Int #

(NFData a, NFData b) => NFData (Either a b) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Either a b -> () #

(IsoValue l, IsoValue r) => IsoValue (Either l r) 
Instance details

Defined in Michelson.Typed.Haskell.Value

Associated Types

type ToT (Either l r) :: T #

Methods

toVal :: Either l r -> Value (ToT (Either l r)) #

fromVal :: Value (ToT (Either l r)) -> Either l r #

PolyTypeHasDocC '[l, r] => TypeHasDoc (Either l r) 
Instance details

Defined in Michelson.Typed.Haskell.Doc

Associated Types

type TypeDocFieldDescriptions (Either l r) :: FieldDescriptions #

(TypeError (DisallowInstance "Either") :: Constraint) => Container (Either a b) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element (Either a b) #

Methods

toList :: Either a b -> [Element (Either a b)] #

null :: Either a b -> Bool #

foldr :: (Element (Either a b) -> b0 -> b0) -> b0 -> Either a b -> b0 #

foldl :: (b0 -> Element (Either a b) -> b0) -> b0 -> Either a b -> b0 #

foldl' :: (b0 -> Element (Either a b) -> b0) -> b0 -> Either a b -> b0 #

length :: Either a b -> Int #

elem :: Element (Either a b) -> Either a b -> Bool #

maximum :: Either a b -> Element (Either a b) #

minimum :: Either a b -> Element (Either a b) #

foldMap :: Monoid m => (Element (Either a b) -> m) -> Either a b -> m #

fold :: Either a b -> Element (Either a b) #

foldr' :: (Element (Either a b) -> b0 -> b0) -> b0 -> Either a b -> b0 #

foldr1 :: (Element (Either a b) -> Element (Either a b) -> Element (Either a b)) -> Either a b -> Element (Either a b) #

foldl1 :: (Element (Either a b) -> Element (Either a b) -> Element (Either a b)) -> Either a b -> Element (Either a b) #

notElem :: Element (Either a b) -> Either a b -> Bool #

all :: (Element (Either a b) -> Bool) -> Either a b -> Bool #

any :: (Element (Either a b) -> Bool) -> Either a b -> Bool #

and :: Either a b -> Bool #

or :: Either a b -> Bool #

find :: (Element (Either a b) -> Bool) -> Either a b -> Maybe (Element (Either a b)) #

safeHead :: Either a b -> Maybe (Element (Either a b)) #

PShow (Either a b) 
Instance details

Defined in Data.Singletons.Prelude.Show

Associated Types

type ShowsPrec arg0 arg1 arg2 :: Symbol #

type Show_ arg0 :: Symbol #

type ShowList arg0 arg1 :: Symbol #

(SShow a, SShow b) => SShow (Either a b) 
Instance details

Defined in Data.Singletons.Prelude.Show

Methods

sShowsPrec :: forall (t1 :: Nat) (t2 :: Either a b) (t3 :: Symbol). Sing t1 -> Sing t2 -> Sing t3 -> Sing (Apply (Apply (Apply ShowsPrecSym0 t1) t2) t3) #

sShow_ :: forall (t :: Either a b). Sing t -> Sing (Apply Show_Sym0 t) #

sShowList :: forall (t1 :: [Either a b]) (t2 :: Symbol). Sing t1 -> Sing t2 -> Sing (Apply (Apply ShowListSym0 t1) t2) #

PSemigroup (Either a b) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

Associated Types

type arg0 <> arg1 :: a0 #

type Sconcat arg0 :: a0 #

SSemigroup (Either a b) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

Methods

(%<>) :: forall (t1 :: Either a b) (t2 :: Either a b). Sing t1 -> Sing t2 -> Sing (Apply (Apply (<>@#@$) t1) t2) #

sSconcat :: forall (t :: NonEmpty (Either a b)). Sing t -> Sing (Apply SconcatSym0 t) #

POrd (Either a b) 
Instance details

Defined in Data.Singletons.Prelude.Ord

Associated Types

type Compare arg0 arg1 :: Ordering #

type arg0 < arg1 :: Bool #

type arg0 <= arg1 :: Bool #

type arg0 > arg1 :: Bool #

type arg0 >= arg1 :: Bool #

type Max arg0 arg1 :: a0 #

type Min arg0 arg1 :: a0 #

(SOrd a, SOrd b) => SOrd (Either a b) 
Instance details

Defined in Data.Singletons.Prelude.Ord

Methods

sCompare :: forall (t1 :: Either a b) (t2 :: Either a b). Sing t1 -> Sing t2 -> Sing (Apply (Apply CompareSym0 t1) t2) #

(%<) :: forall (t1 :: Either a b) (t2 :: Either a b). Sing t1 -> Sing t2 -> Sing (Apply (Apply (<@#@$) t1) t2) #

(%<=) :: forall (t1 :: Either a b) (t2 :: Either a b). Sing t1 -> Sing t2 -> Sing (Apply (Apply (<=@#@$) t1) t2) #

(%>) :: forall (t1 :: Either a b) (t2 :: Either a b). Sing t1 -> Sing t2 -> Sing (Apply (Apply (>@#@$) t1) t2) #

(%>=) :: forall (t1 :: Either a b) (t2 :: Either a b). Sing t1 -> Sing t2 -> Sing (Apply (Apply (>=@#@$) t1) t2) #

sMax :: forall (t1 :: Either a b) (t2 :: Either a b). Sing t1 -> Sing t2 -> Sing (Apply (Apply MaxSym0 t1) t2) #

sMin :: forall (t1 :: Either a b) (t2 :: Either a b). Sing t1 -> Sing t2 -> Sing (Apply (Apply MinSym0 t1) t2) #

(SEq a, SEq b) => SEq (Either a b) 
Instance details

Defined in Data.Singletons.Prelude.Eq

Methods

(%==) :: forall (a0 :: Either a b) (b0 :: Either a b). Sing a0 -> Sing b0 -> Sing (a0 == b0) #

(%/=) :: forall (a0 :: Either a b) (b0 :: Either a b). Sing a0 -> Sing b0 -> Sing (a0 /= b0) #

PEq (Either a b) 
Instance details

Defined in Data.Singletons.Prelude.Eq

Associated Types

type x == y :: Bool #

type x /= y :: Bool #

(Eq a, Eq b) :=> (Eq (Either a b)) 
Instance details

Defined in Data.Constraint

Methods

ins :: (Eq a, Eq b) :- Eq (Either a b) #

(Ord a, Ord b) :=> (Ord (Either a b)) 
Instance details

Defined in Data.Constraint

Methods

ins :: (Ord a, Ord b) :- Ord (Either a b) #

(Read a, Read b) :=> (Read (Either a b)) 
Instance details

Defined in Data.Constraint

Methods

ins :: (Read a, Read b) :- Read (Either a b) #

(Show a, Show b) :=> (Show (Either a b)) 
Instance details

Defined in Data.Constraint

Methods

ins :: (Show a, Show b) :- Show (Either a b) #

(SDecide a, SDecide b) => TestCoercion (SEither :: Either a b -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Instances

Methods

testCoercion :: forall (a0 :: k) (b0 :: k). SEither a0 -> SEither b0 -> Maybe (Coercion a0 b0) #

(SDecide a, SDecide b) => TestEquality (SEither :: Either a b -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Instances

Methods

testEquality :: forall (a0 :: k) (b0 :: k). SEither a0 -> SEither b0 -> Maybe (a0 :~: b0) #

SingI (RightsSym0 :: TyFun [Either a b] [b] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Either

Methods

sing :: Sing RightsSym0 #

SingI (PartitionEithersSym0 :: TyFun [Either a b] ([a], [b]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Either

Methods

sing :: Sing PartitionEithersSym0 #

SingI (LeftsSym0 :: TyFun [Either a b] [a] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Either

Methods

sing :: Sing LeftsSym0 #

SingI (IsRightSym0 :: TyFun (Either a b) Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Either

SingI (IsLeftSym0 :: TyFun (Either a b) Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Either

Methods

sing :: Sing IsLeftSym0 #

SingI (RightSym0 :: TyFun b (Either a b) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Instances

Methods

sing :: Sing RightSym0 #

SingI (LeftSym0 :: TyFun a (Either a b) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Instances

Methods

sing :: Sing LeftSym0 #

SuppressUnusedWarnings (RightsSym0 :: TyFun [Either a6989586621680725238 b6989586621680725239] [b6989586621680725239] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Either

SuppressUnusedWarnings (PartitionEithersSym0 :: TyFun [Either a6989586621680725236 b6989586621680725237] ([a6989586621680725236], [b6989586621680725237]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Either

SuppressUnusedWarnings (LeftsSym0 :: TyFun [Either a6989586621680725240 b6989586621680725241] [a6989586621680725240] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Either

SuppressUnusedWarnings (IsRightSym0 :: TyFun (Either a6989586621680725232 b6989586621680725233) Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Either

SuppressUnusedWarnings (IsLeftSym0 :: TyFun (Either a6989586621680725234 b6989586621680725235) Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Either

SuppressUnusedWarnings (Compare_6989586621679803285Sym0 :: TyFun (Either a6989586621679091038 b6989586621679091039) (Either a6989586621679091038 b6989586621679091039 ~> Ordering) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

SuppressUnusedWarnings (ShowsPrec_6989586621680595791Sym0 :: TyFun Nat (Either a6989586621679091038 b6989586621679091039 ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (Pure_6989586621680024475Sym0 :: TyFun a6989586621679962808 (Either e6989586621680023557 a6989586621679962808) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

SuppressUnusedWarnings (RightSym0 :: TyFun b6989586621679091039 (Either a6989586621679091038 b6989586621679091039) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Instances

SuppressUnusedWarnings (LeftSym0 :: TyFun a6989586621679091038 (Either a6989586621679091038 b6989586621679091039) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Instances

SuppressUnusedWarnings (Let6989586621680187944ASym0 :: TyFun k1 (Either a6989586621679091038 k1) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

(a ~ a', b ~ b') => Each (Either a a') (Either b b') a b

Since: microlens-0.4.11

Instance details

Defined in Lens.Micro.Internal

Methods

each :: Traversal (Either a a') (Either b b') a b #

SingI (Either_Sym0 :: TyFun (a ~> c) ((b ~> c) ~> (Either a b ~> c)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Either

SuppressUnusedWarnings (ShowsPrec_6989586621680595791Sym1 a6989586621680595788 a6989586621679091038 b6989586621679091039 :: TyFun (Either a6989586621679091038 b6989586621679091039) (Symbol ~> Symbol) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (TFHelper_6989586621680024585Sym0 :: TyFun (Either e6989586621680023574 a6989586621679962832) ((a6989586621679962832 ~> Either e6989586621680023574 b6989586621679962833) ~> Either e6989586621680023574 b6989586621679962833) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

SuppressUnusedWarnings (TFHelper_6989586621680024485Sym0 :: TyFun (Either e6989586621680023557 (a6989586621679962809 ~> b6989586621679962810)) (Either e6989586621680023557 a6989586621679962809 ~> Either e6989586621680023557 b6989586621679962810) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

SuppressUnusedWarnings (Compare_6989586621679803285Sym1 a6989586621679803283 :: TyFun (Either a6989586621679091038 b6989586621679091039) Ordering -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

SuppressUnusedWarnings (TFHelper_6989586621680024288Sym0 :: TyFun a6989586621679962805 (Either a6989586621680023545 b6989586621679962806 ~> Either a6989586621680023545 a6989586621679962805) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

SuppressUnusedWarnings (Fmap_6989586621680024267Sym0 :: TyFun (a6989586621679962803 ~> b6989586621679962804) (Either a6989586621680023545 a6989586621679962803 ~> Either a6989586621680023545 b6989586621679962804) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

SuppressUnusedWarnings (Either_Sym0 :: TyFun (a6989586621680723758 ~> c6989586621680723759) ((b6989586621680723760 ~> c6989586621680723759) ~> (Either a6989586621680723758 b6989586621680723760 ~> c6989586621680723759)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Either

SingI d => SingI (Either_Sym1 d b :: TyFun (b ~> c) (Either a b ~> c) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Either

Methods

sing :: Sing (Either_Sym1 d b) #

SuppressUnusedWarnings (TFHelper_6989586621680024485Sym1 a6989586621680024483 :: TyFun (Either e6989586621680023557 a6989586621679962809) (Either e6989586621680023557 b6989586621679962810) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

SuppressUnusedWarnings (TFHelper_6989586621680024288Sym1 a6989586621680024286 a6989586621680023545 b6989586621679962806 :: TyFun (Either a6989586621680023545 b6989586621679962806) (Either a6989586621680023545 a6989586621679962805) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

SuppressUnusedWarnings (Fmap_6989586621680024267Sym1 a6989586621680024265 a6989586621680023545 :: TyFun (Either a6989586621680023545 a6989586621679962803) (Either a6989586621680023545 b6989586621679962804) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

SuppressUnusedWarnings (Traverse_6989586621680995098Sym0 :: TyFun (a6989586621680988964 ~> f6989586621680988963 b6989586621680988965) (Either a6989586621680994521 a6989586621680988964 ~> f6989586621680988963 (Either a6989586621680994521 b6989586621680988965)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

SuppressUnusedWarnings (TFHelper_6989586621680024585Sym1 a6989586621680024583 b6989586621679962833 :: TyFun (a6989586621679962832 ~> Either e6989586621680023574 b6989586621679962833) (Either e6989586621680023574 b6989586621679962833) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

SuppressUnusedWarnings (Either_Sym1 a6989586621680723794 b6989586621680723760 :: TyFun (b6989586621680723760 ~> c6989586621680723759) (Either a6989586621680723758 b6989586621680723760 ~> c6989586621680723759) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Either

(SingI d1, SingI d2) => SingI (Either_Sym2 d1 d2 :: TyFun (Either a b) c -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Either

Methods

sing :: Sing (Either_Sym2 d1 d2) #

SuppressUnusedWarnings (Traverse_6989586621680995098Sym1 a6989586621680995096 a6989586621680994521 :: TyFun (Either a6989586621680994521 a6989586621680988964) (f6989586621680988963 (Either a6989586621680994521 b6989586621680988965)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

SuppressUnusedWarnings (Either_Sym2 a6989586621680723795 a6989586621680723794 :: TyFun (Either a6989586621680723758 b6989586621680723760) c6989586621680723759 -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Either

(Functor f, Functor g) => Functor (Lift Either f g) 
Instance details

Defined in Data.Vinyl.Functor

Methods

fmap :: (a -> b) -> Lift Either f g a -> Lift Either f g b #

(<$) :: a -> Lift Either f g b -> Lift Either f g a #

type MapM (arg1 :: a0 ~> m0 b0) (arg2 :: Either a a0) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type MapM (arg1 :: a0 ~> m0 b0) (arg2 :: Either a a0) = Apply (Apply (MapM_6989586621680989011Sym0 :: TyFun (a0 ~> m0 b0) (Either a a0 ~> m0 (Either a b0)) -> Type) arg1) arg2
type Traverse (a2 :: a6989586621680988964 ~> f6989586621680988963 b6989586621680988965) (a3 :: Either a1 a6989586621680988964) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type Traverse (a2 :: a6989586621680988964 ~> f6989586621680988963 b6989586621680988965) (a3 :: Either a1 a6989586621680988964) = Apply (Apply (Traverse_6989586621680995098Sym0 :: TyFun (a6989586621680988964 ~> f6989586621680988963 b6989586621680988965) (Either a1 a6989586621680988964 ~> f6989586621680988963 (Either a1 b6989586621680988965)) -> Type) a2) a3
type LiftA2 (arg1 :: a0 ~> (b0 ~> c0)) (arg2 :: Either e a0) (arg3 :: Either e b0) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type LiftA2 (arg1 :: a0 ~> (b0 ~> c0)) (arg2 :: Either e a0) (arg3 :: Either e b0) = Apply (Apply (Apply (LiftA2_6989586621679963257Sym0 :: TyFun (a0 ~> (b0 ~> c0)) (Either e a0 ~> (Either e b0 ~> Either e c0)) -> Type) arg1) arg2) arg3
type FoldMap (a2 :: a6989586621680742384 ~> k2) (a3 :: Either a1 a6989586621680742384) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type FoldMap (a2 :: a6989586621680742384 ~> k2) (a3 :: Either a1 a6989586621680742384) = Apply (Apply (FoldMap_6989586621680743697Sym0 :: TyFun (a6989586621680742384 ~> k2) (Either a1 a6989586621680742384 ~> k2) -> Type) a2) a3
type Fmap (a2 :: a6989586621679962803 ~> b6989586621679962804) (a3 :: Either a1 a6989586621679962803) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type Fmap (a2 :: a6989586621679962803 ~> b6989586621679962804) (a3 :: Either a1 a6989586621679962803) = Apply (Apply (Fmap_6989586621680024267Sym0 :: TyFun (a6989586621679962803 ~> b6989586621679962804) (Either a1 a6989586621679962803 ~> Either a1 b6989586621679962804) -> Type) a2) a3
type Foldl' (arg1 :: b0 ~> (a0 ~> b0)) (arg2 :: b0) (arg3 :: Either a a0) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Foldl' (arg1 :: b0 ~> (a0 ~> b0)) (arg2 :: b0) (arg3 :: Either a a0) = Apply (Apply (Apply (Foldl'_6989586621680743162Sym0 :: TyFun (b0 ~> (a0 ~> b0)) (b0 ~> (Either a a0 ~> b0)) -> Type) arg1) arg2) arg3
type Foldl (arg1 :: b0 ~> (a0 ~> b0)) (arg2 :: b0) (arg3 :: Either a a0) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Foldl (arg1 :: b0 ~> (a0 ~> b0)) (arg2 :: b0) (arg3 :: Either a a0) = Apply (Apply (Apply (Foldl_6989586621680743137Sym0 :: TyFun (b0 ~> (a0 ~> b0)) (b0 ~> (Either a a0 ~> b0)) -> Type) arg1) arg2) arg3
type Foldr' (arg1 :: a0 ~> (b0 ~> b0)) (arg2 :: b0) (arg3 :: Either a a0) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Foldr' (arg1 :: a0 ~> (b0 ~> b0)) (arg2 :: b0) (arg3 :: Either a a0) = Apply (Apply (Apply (Foldr'_6989586621680743107Sym0 :: TyFun (a0 ~> (b0 ~> b0)) (b0 ~> (Either a a0 ~> b0)) -> Type) arg1) arg2) arg3
type Foldr (a2 :: a6989586621680742385 ~> (k2 ~> k2)) (a3 :: k2) (a4 :: Either a1 a6989586621680742385) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Foldr (a2 :: a6989586621680742385 ~> (k2 ~> k2)) (a3 :: k2) (a4 :: Either a1 a6989586621680742385) = Apply (Apply (Apply (Foldr_6989586621680743710Sym0 :: TyFun (a6989586621680742385 ~> (k2 ~> k2)) (k2 ~> (Either a1 a6989586621680742385 ~> k2)) -> Type) a2) a3) a4
type Pure (a :: k1) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type Pure (a :: k1) = Apply (Pure_6989586621680024475Sym0 :: TyFun k1 (Either e k1) -> Type) a
type Return (arg0 :: a0) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type Return (arg0 :: a0) = Apply (Return_6989586621679963334Sym0 :: TyFun a0 (Either e a0) -> Type) arg0
type Elem (arg1 :: a0) (arg2 :: Either a a0) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Elem (arg1 :: a0) (arg2 :: Either a a0) = Apply (Apply (Elem_6989586621680743293Sym0 :: TyFun a0 (Either a a0 ~> Bool) -> Type) arg1) arg2
type Foldl1 (arg1 :: a0 ~> (a0 ~> a0)) (arg2 :: Either a a0) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Foldl1 (arg1 :: a0 ~> (a0 ~> a0)) (arg2 :: Either a a0) = Apply (Apply (Foldl1_6989586621680743216Sym0 :: TyFun (a0 ~> (a0 ~> a0)) (Either a a0 ~> a0) -> Type) arg1) arg2
type Foldr1 (arg1 :: a0 ~> (a0 ~> a0)) (arg2 :: Either a a0) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Foldr1 (arg1 :: a0 ~> (a0 ~> a0)) (arg2 :: Either a a0) = Apply (Apply (Foldr1_6989586621680743191Sym0 :: TyFun (a0 ~> (a0 ~> a0)) (Either a a0 ~> a0) -> Type) arg1) arg2
type (a2 :: k1) <$ (a3 :: Either a1 b6989586621679962806) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type (a2 :: k1) <$ (a3 :: Either a1 b6989586621679962806) = Apply (Apply (TFHelper_6989586621680024288Sym0 :: TyFun k1 (Either a1 b6989586621679962806 ~> Either a1 k1) -> Type) a2) a3
type Apply (ShowsPrec_6989586621680595791Sym0 :: TyFun Nat (Either a6989586621679091038 b6989586621679091039 ~> (Symbol ~> Symbol)) -> Type) (a6989586621680595788 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680595791Sym0 :: TyFun Nat (Either a6989586621679091038 b6989586621679091039 ~> (Symbol ~> Symbol)) -> Type) (a6989586621680595788 :: Nat) = ShowsPrec_6989586621680595791Sym1 a6989586621680595788 a6989586621679091038 b6989586621679091039 :: TyFun (Either a6989586621679091038 b6989586621679091039) (Symbol ~> Symbol) -> Type
type Apply (Pure_6989586621680024475Sym0 :: TyFun a (Either e6989586621680023557 a) -> Type) (a6989586621680024474 :: a) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type Apply (Pure_6989586621680024475Sym0 :: TyFun a (Either e6989586621680023557 a) -> Type) (a6989586621680024474 :: a) = Pure_6989586621680024475 a6989586621680024474 :: Either e6989586621680023557 a
type Apply (LeftSym0 :: TyFun a (Either a b6989586621679091039) -> Type) (t6989586621679707106 :: a) 
Instance details

Defined in Data.Singletons.Prelude.Instances

type Apply (LeftSym0 :: TyFun a (Either a b6989586621679091039) -> Type) (t6989586621679707106 :: a) = 'Left t6989586621679707106 :: Either a b6989586621679091039
type Apply (RightSym0 :: TyFun b (Either a6989586621679091038 b) -> Type) (t6989586621679707108 :: b) 
Instance details

Defined in Data.Singletons.Prelude.Instances

type Apply (RightSym0 :: TyFun b (Either a6989586621679091038 b) -> Type) (t6989586621679707108 :: b) = 'Right t6989586621679707108 :: Either a6989586621679091038 b
type Apply (Let6989586621680187944ASym0 :: TyFun k1 (Either a6989586621679091038 k1) -> Type) (wild_69895866216801875286989586621680187943 :: k1) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (Let6989586621680187944ASym0 :: TyFun k1 (Either a6989586621679091038 k1) -> Type) (wild_69895866216801875286989586621680187943 :: k1) = Let6989586621680187944A wild_69895866216801875286989586621680187943 :: Either a6989586621679091038 k1
type Apply (TFHelper_6989586621680024288Sym0 :: TyFun a6989586621679962805 (Either a6989586621680023545 b6989586621679962806 ~> Either a6989586621680023545 a6989586621679962805) -> Type) (a6989586621680024286 :: a6989586621679962805) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type Apply (TFHelper_6989586621680024288Sym0 :: TyFun a6989586621679962805 (Either a6989586621680023545 b6989586621679962806 ~> Either a6989586621680023545 a6989586621679962805) -> Type) (a6989586621680024286 :: a6989586621679962805) = TFHelper_6989586621680024288Sym1 a6989586621680024286 a6989586621680023545 b6989586621679962806 :: TyFun (Either a6989586621680023545 b6989586621679962806) (Either a6989586621680023545 a6989586621679962805) -> Type
type Failure (Either a) 
Instance details

Defined in Basement.Monad

type Failure (Either a) = a
type Product (arg0 :: Either a a0) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Product (arg0 :: Either a a0) = Apply (Product_6989586621680743347Sym0 :: TyFun (Either a a0) a0 -> Type) arg0
type Sum (arg0 :: Either a a0) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Sum (arg0 :: Either a a0) = Apply (Sum_6989586621680743334Sym0 :: TyFun (Either a a0) a0 -> Type) arg0
type Minimum (arg0 :: Either a a0) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Minimum (arg0 :: Either a a0) = Apply (Minimum_6989586621680743321Sym0 :: TyFun (Either a a0) a0 -> Type) arg0
type Maximum (arg0 :: Either a a0) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Maximum (arg0 :: Either a a0) = Apply (Maximum_6989586621680743308Sym0 :: TyFun (Either a a0) a0 -> Type) arg0
type Length (a2 :: Either a1 a6989586621680742397) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Length (a2 :: Either a1 a6989586621680742397) = Apply (Length_6989586621680743726Sym0 :: TyFun (Either a1 a6989586621680742397) Nat -> Type) a2
type Null (a2 :: Either a1 a6989586621680742396) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Null (a2 :: Either a1 a6989586621680742396) = Apply (Null_6989586621680743732Sym0 :: TyFun (Either a1 a6989586621680742396) Bool -> Type) a2
type ToList (arg0 :: Either a a0) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type ToList (arg0 :: Either a a0) = Apply (ToList_6989586621680743240Sym0 :: TyFun (Either a a0) [a0] -> Type) arg0
type Fold (arg0 :: Either a m0) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Fold (arg0 :: Either a m0) = Apply (Fold_6989586621680743057Sym0 :: TyFun (Either a m0) m0 -> Type) arg0
type Sequence (arg0 :: Either a (m0 a0)) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type Sequence (arg0 :: Either a (m0 a0)) = Apply (Sequence_6989586621680989026Sym0 :: TyFun (Either a (m0 a0)) (m0 (Either a a0)) -> Type) arg0
type SequenceA (arg0 :: Either a (f0 a0)) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type SequenceA (arg0 :: Either a (f0 a0)) = Apply (SequenceA_6989586621680989001Sym0 :: TyFun (Either a (f0 a0)) (f0 (Either a a0)) -> Type) arg0
type (arg1 :: Either e a0) <* (arg2 :: Either e b0) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type (arg1 :: Either e a0) <* (arg2 :: Either e b0) = Apply (Apply (TFHelper_6989586621679963287Sym0 :: TyFun (Either e a0) (Either e b0 ~> Either e a0) -> Type) arg1) arg2
type (arg1 :: Either e a0) *> (arg2 :: Either e b0) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type (arg1 :: Either e a0) *> (arg2 :: Either e b0) = Apply (Apply (TFHelper_6989586621679963275Sym0 :: TyFun (Either e a0) (Either e b0 ~> Either e b0) -> Type) arg1) arg2
type (a1 :: Either e (a6989586621679962809 ~> b6989586621679962810)) <*> (a2 :: Either e a6989586621679962809) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type (a1 :: Either e (a6989586621679962809 ~> b6989586621679962810)) <*> (a2 :: Either e a6989586621679962809) = Apply (Apply (TFHelper_6989586621680024485Sym0 :: TyFun (Either e (a6989586621679962809 ~> b6989586621679962810)) (Either e a6989586621679962809 ~> Either e b6989586621679962810) -> Type) a1) a2
type (arg1 :: Either e a0) >> (arg2 :: Either e b0) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type (arg1 :: Either e a0) >> (arg2 :: Either e b0) = Apply (Apply (TFHelper_6989586621679963313Sym0 :: TyFun (Either e a0) (Either e b0 ~> Either e b0) -> Type) arg1) arg2
type (a1 :: Either e a6989586621679962832) >>= (a2 :: a6989586621679962832 ~> Either e b6989586621679962833) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type (a1 :: Either e a6989586621679962832) >>= (a2 :: a6989586621679962832 ~> Either e b6989586621679962833) = Apply (Apply (TFHelper_6989586621680024585Sym0 :: TyFun (Either e a6989586621679962832) ((a6989586621679962832 ~> Either e b6989586621679962833) ~> Either e b6989586621679962833) -> Type) a1) a2
type Rep1 (Either a :: Type -> Type) 
Instance details

Defined in GHC.Generics

type HKD (Either a :: Type -> Type) (b :: Type) 
Instance details

Defined in Data.Vinyl.XRec

type HKD (Either a :: Type -> Type) (b :: Type) = Either a b
type Apply (RightsSym0 :: TyFun [Either a b] [b] -> Type) (a6989586621680725507 :: [Either a b]) 
Instance details

Defined in Data.Singletons.Prelude.Either

type Apply (RightsSym0 :: TyFun [Either a b] [b] -> Type) (a6989586621680725507 :: [Either a b]) = Rights a6989586621680725507
type Apply (LeftsSym0 :: TyFun [Either a b] [a] -> Type) (a6989586621680725512 :: [Either a b]) 
Instance details

Defined in Data.Singletons.Prelude.Either

type Apply (LeftsSym0 :: TyFun [Either a b] [a] -> Type) (a6989586621680725512 :: [Either a b]) = Lefts a6989586621680725512
type Apply (PartitionEithersSym0 :: TyFun [Either a b] ([a], [b]) -> Type) (a6989586621680725487 :: [Either a b]) 
Instance details

Defined in Data.Singletons.Prelude.Either

type Apply (PartitionEithersSym0 :: TyFun [Either a b] ([a], [b]) -> Type) (a6989586621680725487 :: [Either a b]) = PartitionEithers a6989586621680725487
type Rep (Either a b) 
Instance details

Defined in GHC.Generics

type ToT (Either l r) 
Instance details

Defined in Michelson.Typed.Haskell.Value

type ToT (Either l r) = GValueType (Rep (Either l r))
type TypeDocFieldDescriptions (Either l r) 
Instance details

Defined in Michelson.Typed.Haskell.Doc

type Sing 
Instance details

Defined in Data.Singletons.Prelude.Instances

type Sing = SEither :: Either a b -> Type
type Element (Either a b) 
Instance details

Defined in Universum.Container.Class

type Element (Either a b) = ElementDefault (Either a b)
type Demote (Either a b) 
Instance details

Defined in Data.Singletons.Prelude.Instances

type Demote (Either a b) = Either (Demote a) (Demote b)
type Show_ (arg0 :: Either a b) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Show_ (arg0 :: Either a b) = Apply (Show__6989586621680577846Sym0 :: TyFun (Either a b) Symbol -> Type) arg0
type Sconcat (arg0 :: NonEmpty (Either a b)) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Sconcat (arg0 :: NonEmpty (Either a b)) = Apply (Sconcat_6989586621680187691Sym0 :: TyFun (NonEmpty (Either a b)) (Either a b) -> Type) arg0
type ShowList (arg1 :: [Either a b]) arg2 
Instance details

Defined in Data.Singletons.Prelude.Show

type ShowList (arg1 :: [Either a b]) arg2 = Apply (Apply (ShowList_6989586621680577854Sym0 :: TyFun [Either a b] (Symbol ~> Symbol) -> Type) arg1) arg2
type (a2 :: Either a1 b) <> (a3 :: Either a1 b) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type (a2 :: Either a1 b) <> (a3 :: Either a1 b) = Apply (Apply (TFHelper_6989586621680187936Sym0 :: TyFun (Either a1 b) (Either a1 b ~> Either a1 b) -> Type) a2) a3
type Min (arg1 :: Either a b) (arg2 :: Either a b) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Min (arg1 :: Either a b) (arg2 :: Either a b) = Apply (Apply (Min_6989586621679792614Sym0 :: TyFun (Either a b) (Either a b ~> Either a b) -> Type) arg1) arg2
type Max (arg1 :: Either a b) (arg2 :: Either a b) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Max (arg1 :: Either a b) (arg2 :: Either a b) = Apply (Apply (Max_6989586621679792596Sym0 :: TyFun (Either a b) (Either a b ~> Either a b) -> Type) arg1) arg2
type (arg1 :: Either a b) >= (arg2 :: Either a b) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type (arg1 :: Either a b) >= (arg2 :: Either a b) = Apply (Apply (TFHelper_6989586621679792578Sym0 :: TyFun (Either a b) (Either a b ~> Bool) -> Type) arg1) arg2
type (arg1 :: Either a b) > (arg2 :: Either a b) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type (arg1 :: Either a b) > (arg2 :: Either a b) = Apply (Apply (TFHelper_6989586621679792560Sym0 :: TyFun (Either a b) (Either a b ~> Bool) -> Type) arg1) arg2
type (arg1 :: Either a b) <= (arg2 :: Either a b) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type (arg1 :: Either a b) <= (arg2 :: Either a b) = Apply (Apply (TFHelper_6989586621679792542Sym0 :: TyFun (Either a b) (Either a b ~> Bool) -> Type) arg1) arg2
type (arg1 :: Either a b) < (arg2 :: Either a b) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type (arg1 :: Either a b) < (arg2 :: Either a b) = Apply (Apply (TFHelper_6989586621679792524Sym0 :: TyFun (Either a b) (Either a b ~> Bool) -> Type) arg1) arg2
type Compare (a2 :: Either a1 b) (a3 :: Either a1 b) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Compare (a2 :: Either a1 b) (a3 :: Either a1 b) = Apply (Apply (Compare_6989586621679803285Sym0 :: TyFun (Either a1 b) (Either a1 b ~> Ordering) -> Type) a2) a3
type (x :: Either a b) /= (y :: Either a b) 
Instance details

Defined in Data.Singletons.Prelude.Eq

type (x :: Either a b) /= (y :: Either a b) = Not (x == y)
type (a2 :: Either a1 b1) == (b2 :: Either a1 b1) 
Instance details

Defined in Data.Singletons.Prelude.Eq

type (a2 :: Either a1 b1) == (b2 :: Either a1 b1) = Equals_6989586621679776106 a2 b2
type ShowsPrec a2 (a3 :: Either a1 b) a4 
Instance details

Defined in Data.Singletons.Prelude.Show

type ShowsPrec a2 (a3 :: Either a1 b) a4 = Apply (Apply (Apply (ShowsPrec_6989586621680595791Sym0 :: TyFun Nat (Either a1 b ~> (Symbol ~> Symbol)) -> Type) a2) a3) a4
type Apply (IsRightSym0 :: TyFun (Either a b) Bool -> Type) (a6989586621680725481 :: Either a b) 
Instance details

Defined in Data.Singletons.Prelude.Either

type Apply (IsRightSym0 :: TyFun (Either a b) Bool -> Type) (a6989586621680725481 :: Either a b) = IsRight a6989586621680725481
type Apply (IsLeftSym0 :: TyFun (Either a b) Bool -> Type) (a6989586621680725483 :: Either a b) 
Instance details

Defined in Data.Singletons.Prelude.Either

type Apply (IsLeftSym0 :: TyFun (Either a b) Bool -> Type) (a6989586621680725483 :: Either a b) = IsLeft a6989586621680725483
type Apply (Compare_6989586621679803285Sym1 a6989586621679803283 :: TyFun (Either a b) Ordering -> Type) (a6989586621679803284 :: Either a b) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Apply (Compare_6989586621679803285Sym1 a6989586621679803283 :: TyFun (Either a b) Ordering -> Type) (a6989586621679803284 :: Either a b) = Compare_6989586621679803285 a6989586621679803283 a6989586621679803284
type Apply (Either_Sym2 a6989586621680723795 a6989586621680723794 :: TyFun (Either a b) c -> Type) (a6989586621680723796 :: Either a b) 
Instance details

Defined in Data.Singletons.Prelude.Either

type Apply (Either_Sym2 a6989586621680723795 a6989586621680723794 :: TyFun (Either a b) c -> Type) (a6989586621680723796 :: Either a b) = Either_ a6989586621680723795 a6989586621680723794 a6989586621680723796
type Apply (Traverse_6989586621680995098Sym1 a6989586621680995096 a2 :: TyFun (Either a2 a1) (f (Either a2 b)) -> Type) (a6989586621680995097 :: Either a2 a1) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type Apply (Traverse_6989586621680995098Sym1 a6989586621680995096 a2 :: TyFun (Either a2 a1) (f (Either a2 b)) -> Type) (a6989586621680995097 :: Either a2 a1) = Traverse_6989586621680995098 a6989586621680995096 a6989586621680995097
type Apply (Compare_6989586621679803285Sym0 :: TyFun (Either a6989586621679091038 b6989586621679091039) (Either a6989586621679091038 b6989586621679091039 ~> Ordering) -> Type) (a6989586621679803283 :: Either a6989586621679091038 b6989586621679091039) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Apply (Compare_6989586621679803285Sym0 :: TyFun (Either a6989586621679091038 b6989586621679091039) (Either a6989586621679091038 b6989586621679091039 ~> Ordering) -> Type) (a6989586621679803283 :: Either a6989586621679091038 b6989586621679091039) = Compare_6989586621679803285Sym1 a6989586621679803283
type Apply (ShowsPrec_6989586621680595791Sym1 a6989586621680595788 a6989586621679091038 b6989586621679091039 :: TyFun (Either a6989586621679091038 b6989586621679091039) (Symbol ~> Symbol) -> Type) (a6989586621680595789 :: Either a6989586621679091038 b6989586621679091039) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680595791Sym1 a6989586621680595788 a6989586621679091038 b6989586621679091039 :: TyFun (Either a6989586621679091038 b6989586621679091039) (Symbol ~> Symbol) -> Type) (a6989586621680595789 :: Either a6989586621679091038 b6989586621679091039) = ShowsPrec_6989586621680595791Sym2 a6989586621680595788 a6989586621680595789
type Apply (TFHelper_6989586621680024485Sym0 :: TyFun (Either e6989586621680023557 (a6989586621679962809 ~> b6989586621679962810)) (Either e6989586621680023557 a6989586621679962809 ~> Either e6989586621680023557 b6989586621679962810) -> Type) (a6989586621680024483 :: Either e6989586621680023557 (a6989586621679962809 ~> b6989586621679962810)) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type Apply (TFHelper_6989586621680024485Sym0 :: TyFun (Either e6989586621680023557 (a6989586621679962809 ~> b6989586621679962810)) (Either e6989586621680023557 a6989586621679962809 ~> Either e6989586621680023557 b6989586621679962810) -> Type) (a6989586621680024483 :: Either e6989586621680023557 (a6989586621679962809 ~> b6989586621679962810)) = TFHelper_6989586621680024485Sym1 a6989586621680024483
type Apply (TFHelper_6989586621680024585Sym0 :: TyFun (Either e6989586621680023574 a6989586621679962832) ((a6989586621679962832 ~> Either e6989586621680023574 b6989586621679962833) ~> Either e6989586621680023574 b6989586621679962833) -> Type) (a6989586621680024583 :: Either e6989586621680023574 a6989586621679962832) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type Apply (TFHelper_6989586621680024585Sym0 :: TyFun (Either e6989586621680023574 a6989586621679962832) ((a6989586621679962832 ~> Either e6989586621680023574 b6989586621679962833) ~> Either e6989586621680023574 b6989586621679962833) -> Type) (a6989586621680024583 :: Either e6989586621680023574 a6989586621679962832) = TFHelper_6989586621680024585Sym1 a6989586621680024583 b6989586621679962833 :: TyFun (a6989586621679962832 ~> Either e6989586621680023574 b6989586621679962833) (Either e6989586621680023574 b6989586621679962833) -> Type
type Apply (Fmap_6989586621680024267Sym0 :: TyFun (a6989586621679962803 ~> b6989586621679962804) (Either a6989586621680023545 a6989586621679962803 ~> Either a6989586621680023545 b6989586621679962804) -> Type) (a6989586621680024265 :: a6989586621679962803 ~> b6989586621679962804) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type Apply (Fmap_6989586621680024267Sym0 :: TyFun (a6989586621679962803 ~> b6989586621679962804) (Either a6989586621680023545 a6989586621679962803 ~> Either a6989586621680023545 b6989586621679962804) -> Type) (a6989586621680024265 :: a6989586621679962803 ~> b6989586621679962804) = Fmap_6989586621680024267Sym1 a6989586621680024265 a6989586621680023545 :: TyFun (Either a6989586621680023545 a6989586621679962803) (Either a6989586621680023545 b6989586621679962804) -> Type
type Apply (Either_Sym0 :: TyFun (a6989586621680723758 ~> c6989586621680723759) ((b6989586621680723760 ~> c6989586621680723759) ~> (Either a6989586621680723758 b6989586621680723760 ~> c6989586621680723759)) -> Type) (a6989586621680723794 :: a6989586621680723758 ~> c6989586621680723759) 
Instance details

Defined in Data.Singletons.Prelude.Either

type Apply (Either_Sym0 :: TyFun (a6989586621680723758 ~> c6989586621680723759) ((b6989586621680723760 ~> c6989586621680723759) ~> (Either a6989586621680723758 b6989586621680723760 ~> c6989586621680723759)) -> Type) (a6989586621680723794 :: a6989586621680723758 ~> c6989586621680723759) = Either_Sym1 a6989586621680723794 b6989586621680723760 :: TyFun (b6989586621680723760 ~> c6989586621680723759) (Either a6989586621680723758 b6989586621680723760 ~> c6989586621680723759) -> Type
type Apply (Fmap_6989586621680024267Sym1 a6989586621680024265 a2 :: TyFun (Either a2 a1) (Either a2 b) -> Type) (a6989586621680024266 :: Either a2 a1) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type Apply (Fmap_6989586621680024267Sym1 a6989586621680024265 a2 :: TyFun (Either a2 a1) (Either a2 b) -> Type) (a6989586621680024266 :: Either a2 a1) = Fmap_6989586621680024267 a6989586621680024265 a6989586621680024266
type Apply (TFHelper_6989586621680024288Sym1 a6989586621680024286 a2 b :: TyFun (Either a2 b) (Either a2 a1) -> Type) (a6989586621680024287 :: Either a2 b) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type Apply (TFHelper_6989586621680024288Sym1 a6989586621680024286 a2 b :: TyFun (Either a2 b) (Either a2 a1) -> Type) (a6989586621680024287 :: Either a2 b) = TFHelper_6989586621680024288 a6989586621680024286 a6989586621680024287
type Apply (TFHelper_6989586621680024485Sym1 a6989586621680024483 :: TyFun (Either e a) (Either e b) -> Type) (a6989586621680024484 :: Either e a) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type Apply (TFHelper_6989586621680024485Sym1 a6989586621680024483 :: TyFun (Either e a) (Either e b) -> Type) (a6989586621680024484 :: Either e a) = TFHelper_6989586621680024485 a6989586621680024483 a6989586621680024484
type Apply (Traverse_6989586621680995098Sym0 :: TyFun (a6989586621680988964 ~> f6989586621680988963 b6989586621680988965) (Either a6989586621680994521 a6989586621680988964 ~> f6989586621680988963 (Either a6989586621680994521 b6989586621680988965)) -> Type) (a6989586621680995096 :: a6989586621680988964 ~> f6989586621680988963 b6989586621680988965) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type Apply (Traverse_6989586621680995098Sym0 :: TyFun (a6989586621680988964 ~> f6989586621680988963 b6989586621680988965) (Either a6989586621680994521 a6989586621680988964 ~> f6989586621680988963 (Either a6989586621680994521 b6989586621680988965)) -> Type) (a6989586621680995096 :: a6989586621680988964 ~> f6989586621680988963 b6989586621680988965) = Traverse_6989586621680995098Sym1 a6989586621680995096 a6989586621680994521 :: TyFun (Either a6989586621680994521 a6989586621680988964) (f6989586621680988963 (Either a6989586621680994521 b6989586621680988965)) -> Type
type Apply (TFHelper_6989586621680024585Sym1 a6989586621680024583 b :: TyFun (a ~> Either e b) (Either e b) -> Type) (a6989586621680024584 :: a ~> Either e b) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type Apply (TFHelper_6989586621680024585Sym1 a6989586621680024583 b :: TyFun (a ~> Either e b) (Either e b) -> Type) (a6989586621680024584 :: a ~> Either e b) = TFHelper_6989586621680024585 a6989586621680024583 a6989586621680024584
type Apply (Either_Sym1 a6989586621680723794 b6989586621680723760 :: TyFun (b6989586621680723760 ~> c6989586621680723759) (Either a6989586621680723758 b6989586621680723760 ~> c6989586621680723759) -> Type) (a6989586621680723795 :: b6989586621680723760 ~> c6989586621680723759) 
Instance details

Defined in Data.Singletons.Prelude.Either

type Apply (Either_Sym1 a6989586621680723794 b6989586621680723760 :: TyFun (b6989586621680723760 ~> c6989586621680723759) (Either a6989586621680723758 b6989586621680723760 ~> c6989586621680723759) -> Type) (a6989586621680723795 :: b6989586621680723760 ~> c6989586621680723759) = Either_Sym2 a6989586621680723794 a6989586621680723795
type Eval (Map f ('Right a3 :: Either a2 a1) :: Either a2 b -> Type) 
Instance details

Defined in Fcf.Classes

type Eval (Map f ('Right a3 :: Either a2 a1) :: Either a2 b -> Type) = 'Right (Eval (f a3)) :: Either a2 b
type Eval (Map f ('Left x :: Either a2 a1) :: Either a2 b -> Type) 
Instance details

Defined in Fcf.Classes

type Eval (Map f ('Left x :: Either a2 a1) :: Either a2 b -> Type) = 'Left x :: Either a2 b
type Eval (Bimap f g ('Right y :: Either a b1) :: Either a' b2 -> Type) 
Instance details

Defined in Fcf.Classes

type Eval (Bimap f g ('Right y :: Either a b1) :: Either a' b2 -> Type) = 'Right (Eval (g y)) :: Either a' b2
type Eval (Bimap f g ('Left x :: Either a1 b) :: Either a2 b' -> Type) 
Instance details

Defined in Fcf.Classes

type Eval (Bimap f g ('Left x :: Either a1 b) :: Either a2 b' -> Type) = 'Left (Eval (f x)) :: Either a2 b'

data Constraint #

The kind of constraints, like Show a

type family CmpNat (a :: Nat) (b :: Nat) :: Ordering where ... #

Comparison of type-level naturals, as a function.

Since: base-4.7.0.0

class a ~R# b => Coercible (a :: k) (b :: k) #

Coercible is a two-parameter class that has instances for types a and b if the compiler can infer that they have the same representation. This class does not have regular instances; instead they are created on-the-fly during type-checking. Trying to manually declare an instance of Coercible is an error.

Nevertheless one can pretend that the following three kinds of instances exist. First, as a trivial base-case:

instance Coercible a a

Furthermore, for every type constructor there is an instance that allows to coerce under the type constructor. For example, let D be a prototypical type constructor (data or newtype) with three type arguments, which have roles nominal, representational resp. phantom. Then there is an instance of the form

instance Coercible b b' => Coercible (D a b c) (D a b' c')

Note that the nominal type arguments are equal, the representational type arguments can differ, but need to have a Coercible instance themself, and the phantom type arguments can be changed arbitrarily.

The third kind of instance exists for every newtype NT = MkNT T and comes in two variants, namely

instance Coercible a T => Coercible a NT
instance Coercible T b => Coercible NT b

This instance is only usable if the constructor MkNT is in scope.

If, as a library author of a type constructor like Set a, you want to prevent a user of your module to write coerce :: Set T -> Set NT, you need to set the role of Set's type parameter to nominal, by writing

type role Set nominal

For more details about this feature, please refer to Safe Coercions by Joachim Breitner, Richard A. Eisenberg, Simon Peyton Jones and Stephanie Weirich.

Since: ghc-prim-4.7.0.0

Instances

Instances details
HasDict (Coercible a b) (Coercion a b) 
Instance details

Defined in Data.Constraint

Methods

evidence :: Coercion a b -> Dict (Coercible a b) #

data CallStack #

CallStacks are a lightweight method of obtaining a partial call-stack at any point in the program.

A function can request its call-site with the HasCallStack constraint. For example, we can define

putStrLnWithCallStack :: HasCallStack => String -> IO ()

as a variant of putStrLn that will get its call-site and print it, along with the string given as argument. We can access the call-stack inside putStrLnWithCallStack with callStack.

putStrLnWithCallStack :: HasCallStack => String -> IO ()
putStrLnWithCallStack msg = do
  putStrLn msg
  putStrLn (prettyCallStack callStack)

Thus, if we call putStrLnWithCallStack we will get a formatted call-stack alongside our string.

>>> putStrLnWithCallStack "hello"
hello
CallStack (from HasCallStack):
  putStrLnWithCallStack, called at <interactive>:2:1 in interactive:Ghci1

GHC solves HasCallStack constraints in three steps:

  1. If there is a CallStack in scope -- i.e. the enclosing function has a HasCallStack constraint -- GHC will append the new call-site to the existing CallStack.
  2. If there is no CallStack in scope -- e.g. in the GHCi session above -- and the enclosing definition does not have an explicit type signature, GHC will infer a HasCallStack constraint for the enclosing definition (subject to the monomorphism restriction).
  3. If there is no CallStack in scope and the enclosing definition has an explicit type signature, GHC will solve the HasCallStack constraint for the singleton CallStack containing just the current call-site.

CallStacks do not interact with the RTS and do not require compilation with -prof. On the other hand, as they are built up explicitly via the HasCallStack constraints, they will generally not contain as much information as the simulated call-stacks maintained by the RTS.

A CallStack is a [(String, SrcLoc)]. The String is the name of function that was called, the SrcLoc is the call-site. The list is ordered with the most recently called function at the head.

NOTE: The intrepid user may notice that HasCallStack is just an alias for an implicit parameter ?callStack :: CallStack. This is an implementation detail and should not be considered part of the CallStack API, we may decide to change the implementation in the future.

Since: base-4.8.1.0

Instances

Instances details
IsList CallStack

Be aware that 'fromList . toList = id' only for unfrozen CallStacks, since toList removes frozenness information.

Since: base-4.9.0.0

Instance details

Defined in GHC.Exts

Associated Types

type Item CallStack #

Show CallStack

Since: base-4.9.0.0

Instance details

Defined in GHC.Show

NFData CallStack

Since: deepseq-1.4.2.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CallStack -> () #

type Item CallStack 
Instance details

Defined in GHC.Exts

type String = [Char] #

A String is a list of characters. String constants in Haskell are values of type String.

id :: a -> a #

Identity function.

id x = x

either :: (a -> c) -> (b -> c) -> Either a b -> c #

Case analysis for the Either type. If the value is Left a, apply the first function to a; if it is Right b, apply the second function to b.

Examples

Expand

We create two values of type Either String Int, one using the Left constructor and another using the Right constructor. Then we apply "either" the length function (if we have a String) or the "times-two" function (if we have an Int):

>>> let s = Left "foo" :: Either String Int
>>> let n = Right 3 :: Either String Int
>>> either length (*2) s
3
>>> either length (*2) n
6

class Monad m => MonadReader r (m :: Type -> Type) | m -> r where #

See examples in Control.Monad.Reader. Note, the partially applied function type (->) r is a simple reader monad. See the instance declaration below.

Minimal complete definition

(ask | reader), local

Methods

ask :: m r #

Retrieves the monad environment.

local #

Arguments

:: (r -> r)

The function to modify the environment.

-> m a

Reader to run in the modified environment.

-> m a 

Executes a computation in a modified environment.

reader #

Arguments

:: (r -> a)

The selector function to apply to the environment.

-> m a 

Retrieves a function of the current environment.

Instances

Instances details
MonadReader s (ReifiedGetter s) 
Instance details

Defined in Control.Lens.Reified

Methods

ask :: ReifiedGetter s s #

local :: (s -> s) -> ReifiedGetter s a -> ReifiedGetter s a #

reader :: (s -> a) -> ReifiedGetter s a #

MonadReader s (ReifiedFold s) 
Instance details

Defined in Control.Lens.Reified

Methods

ask :: ReifiedFold s s #

local :: (s -> s) -> ReifiedFold s a -> ReifiedFold s a #

reader :: (s -> a) -> ReifiedFold s a #

(Functor m, MonadReader e m) => MonadReader e (Free m) 
Instance details

Defined in Control.Monad.Free

Methods

ask :: Free m e #

local :: (e -> e) -> Free m a -> Free m a #

reader :: (e -> a) -> Free m a #

(Representable f, Rep f ~ a) => MonadReader a (Co f) 
Instance details

Defined in Data.Functor.Rep

Methods

ask :: Co f a #

local :: (a -> a) -> Co f a0 -> Co f a0 #

reader :: (a -> a0) -> Co f a0 #

MonadReader r m => MonadReader r (MaybeT m) 
Instance details

Defined in Control.Monad.Reader.Class

Methods

ask :: MaybeT m r #

local :: (r -> r) -> MaybeT m a -> MaybeT m a #

reader :: (r -> a) -> MaybeT m a #

MonadReader r m => MonadReader r (ListT m) 
Instance details

Defined in Control.Monad.Reader.Class

Methods

ask :: ListT m r #

local :: (r -> r) -> ListT m a -> ListT m a #

reader :: (r -> a) -> ListT m a #

Monad m => MonadReader r (ReaderT r m) 
Instance details

Defined in Control.Monad.Reader.Class

Methods

ask :: ReaderT r m r #

local :: (r -> r) -> ReaderT r m a -> ReaderT r m a #

reader :: (r -> a) -> ReaderT r m a #

(Functor f, MonadReader r m) => MonadReader r (FreeT f m) 
Instance details

Defined in Control.Monad.Trans.Free

Methods

ask :: FreeT f m r #

local :: (r -> r) -> FreeT f m a -> FreeT f m a #

reader :: (r -> a) -> FreeT f m a #

(Monoid w, MonadReader r m) => MonadReader r (WriterT w m) 
Instance details

Defined in Control.Monad.Reader.Class

Methods

ask :: WriterT w m r #

local :: (r -> r) -> WriterT w m a -> WriterT w m a #

reader :: (r -> a) -> WriterT w m a #

(Monoid w, MonadReader r m) => MonadReader r (WriterT w m) 
Instance details

Defined in Control.Monad.Reader.Class

Methods

ask :: WriterT w m r #

local :: (r -> r) -> WriterT w m a -> WriterT w m a #

reader :: (r -> a) -> WriterT w m a #

MonadReader r m => MonadReader r (StateT s m) 
Instance details

Defined in Control.Monad.Reader.Class

Methods

ask :: StateT s m r #

local :: (r -> r) -> StateT s m a -> StateT s m a #

reader :: (r -> a) -> StateT s m a #

MonadReader r m => MonadReader r (StateT s m) 
Instance details

Defined in Control.Monad.Reader.Class

Methods

ask :: StateT s m r #

local :: (r -> r) -> StateT s m a -> StateT s m a #

reader :: (r -> a) -> StateT s m a #

MonadReader r m => MonadReader r (IdentityT m) 
Instance details

Defined in Control.Monad.Reader.Class

Methods

ask :: IdentityT m r #

local :: (r -> r) -> IdentityT m a -> IdentityT m a #

reader :: (r -> a) -> IdentityT m a #

MonadReader r m => MonadReader r (ExceptT e m)

Since: mtl-2.2

Instance details

Defined in Control.Monad.Reader.Class

Methods

ask :: ExceptT e m r #

local :: (r -> r) -> ExceptT e m a -> ExceptT e m a #

reader :: (r -> a) -> ExceptT e m a #

(Error e, MonadReader r m) => MonadReader r (ErrorT e m) 
Instance details

Defined in Control.Monad.Reader.Class

Methods

ask :: ErrorT e m r #

local :: (r -> r) -> ErrorT e m a -> ErrorT e m a #

reader :: (r -> a) -> ErrorT e m a #

MonadReader r ((->) r :: Type -> Type) 
Instance details

Defined in Control.Monad.Reader.Class

Methods

ask :: r -> r #

local :: (r -> r) -> (r -> a) -> r -> a #

reader :: (r -> a) -> r -> a #

MonadReader r' m => MonadReader r' (ContT r m) 
Instance details

Defined in Control.Monad.Reader.Class

Methods

ask :: ContT r m r' #

local :: (r' -> r') -> ContT r m a -> ContT r m a #

reader :: (r' -> a) -> ContT r m a #

(Monad m, Monoid w) => MonadReader r (RWST r w s m) 
Instance details

Defined in Control.Monad.Reader.Class

Methods

ask :: RWST r w s m r #

local :: (r -> r) -> RWST r w s m a -> RWST r w s m a #

reader :: (r -> a) -> RWST r w s m a #

(Monad m, Monoid w) => MonadReader r (RWST r w s m) 
Instance details

Defined in Control.Monad.Reader.Class

Methods

ask :: RWST r w s m r #

local :: (r -> r) -> RWST r w s m a -> RWST r w s m a #

reader :: (r -> a) -> RWST r w s m a #

class Monad m => MonadState s (m :: Type -> Type) | m -> s where #

Minimal definition is either both of get and put or just state

Minimal complete definition

state | get, put

Methods

put :: s -> m () #

Replace the state inside the monad.

state :: (s -> (a, s)) -> m a #

Embed a simple state action into the monad.

Instances

Instances details
(Functor m, MonadState s m) => MonadState s (Free m) 
Instance details

Defined in Control.Monad.Free

Methods

get :: Free m s #

put :: s -> Free m () #

state :: (s -> (a, s)) -> Free m a #

MonadState s m => MonadState s (MaybeT m) 
Instance details

Defined in Control.Monad.State.Class

Methods

get :: MaybeT m s #

put :: s -> MaybeT m () #

state :: (s -> (a, s)) -> MaybeT m a #

MonadState s m => MonadState s (ListT m) 
Instance details

Defined in Control.Monad.State.Class

Methods

get :: ListT m s #

put :: s -> ListT m () #

state :: (s -> (a, s)) -> ListT m a #

Monad m => MonadState s (StateT s m) 
Instance details

Defined in Control.Monad.State.Class

Methods

get :: StateT s m s #

put :: s -> StateT s m () #

state :: (s -> (a, s)) -> StateT s m a #

(Functor f, MonadState s m) => MonadState s (FreeT f m) 
Instance details

Defined in Control.Monad.Trans.Free

Methods

get :: FreeT f m s #

put :: s -> FreeT f m () #

state :: (s -> (a, s)) -> FreeT f m a #

(Monoid w, MonadState s m) => MonadState s (WriterT w m) 
Instance details

Defined in Control.Monad.State.Class

Methods

get :: WriterT w m s #

put :: s -> WriterT w m () #

state :: (s -> (a, s)) -> WriterT w m a #

(Monoid w, MonadState s m) => MonadState s (WriterT w m) 
Instance details

Defined in Control.Monad.State.Class

Methods

get :: WriterT w m s #

put :: s -> WriterT w m () #

state :: (s -> (a, s)) -> WriterT w m a #

Monad m => MonadState s (StateT s m) 
Instance details

Defined in Control.Monad.State.Class

Methods

get :: StateT s m s #

put :: s -> StateT s m () #

state :: (s -> (a, s)) -> StateT s m a #

MonadState s m => MonadState s (ReaderT r m) 
Instance details

Defined in Control.Monad.State.Class

Methods

get :: ReaderT r m s #

put :: s -> ReaderT r m () #

state :: (s -> (a, s)) -> ReaderT r m a #

MonadState s m => MonadState s (IdentityT m) 
Instance details

Defined in Control.Monad.State.Class

Methods

get :: IdentityT m s #

put :: s -> IdentityT m () #

state :: (s -> (a, s)) -> IdentityT m a #

MonadState s m => MonadState s (ExceptT e m)

Since: mtl-2.2

Instance details

Defined in Control.Monad.State.Class

Methods

get :: ExceptT e m s #

put :: s -> ExceptT e m () #

state :: (s -> (a, s)) -> ExceptT e m a #

(Error e, MonadState s m) => MonadState s (ErrorT e m) 
Instance details

Defined in Control.Monad.State.Class

Methods

get :: ErrorT e m s #

put :: s -> ErrorT e m () #

state :: (s -> (a, s)) -> ErrorT e m a #

MonadState s m => MonadState s (ContT r m) 
Instance details

Defined in Control.Monad.State.Class

Methods

get :: ContT r m s #

put :: s -> ContT r m () #

state :: (s -> (a, s)) -> ContT r m a #

(Monad m, Monoid w) => MonadState s (RWST r w s m) 
Instance details

Defined in Control.Monad.State.Class

Methods

get :: RWST r w s m s #

put :: s -> RWST r w s m () #

state :: (s -> (a, s)) -> RWST r w s m a #

(Monad m, Monoid w) => MonadState s (RWST r w s m) 
Instance details

Defined in Control.Monad.State.Class

Methods

get :: RWST r w s m s #

put :: s -> RWST r w s m () #

state :: (s -> (a, s)) -> RWST r w s m a #

data ByteString #

A space-efficient representation of a Word8 vector, supporting many efficient operations.

A ByteString contains 8-bit bytes, or by using the operations from Data.ByteString.Char8 it can be interpreted as containing 8-bit characters.

Instances

Instances details
Eq ByteString 
Instance details

Defined in Data.ByteString.Internal

Data ByteString 
Instance details

Defined in Data.ByteString.Internal

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ByteString -> c ByteString #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ByteString #

toConstr :: ByteString -> Constr #

dataTypeOf :: ByteString -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ByteString) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ByteString) #

gmapT :: (forall b. Data b => b -> b) -> ByteString -> ByteString #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ByteString -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ByteString -> r #

gmapQ :: (forall d. Data d => d -> u) -> ByteString -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ByteString -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ByteString -> m ByteString #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ByteString -> m ByteString #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ByteString -> m ByteString #

Ord ByteString 
Instance details

Defined in Data.ByteString.Internal

Read ByteString 
Instance details

Defined in Data.ByteString.Internal

Show ByteString 
Instance details

Defined in Data.ByteString.Internal

IsString ByteString 
Instance details

Defined in Data.ByteString.Internal

Semigroup ByteString 
Instance details

Defined in Data.ByteString.Internal

Monoid ByteString 
Instance details

Defined in Data.ByteString.Internal

Hashable ByteString 
Instance details

Defined in Data.Hashable.Class

Chunk ByteString 
Instance details

Defined in Data.Attoparsec.Internal.Types

Associated Types

type ChunkElem ByteString #

NFData ByteString 
Instance details

Defined in Data.ByteString.Internal

Methods

rnf :: ByteString -> () #

Ixed ByteString 
Instance details

Defined in Control.Lens.At

SizeOpHs ByteString 
Instance details

Defined in Lorentz.Polymorphic

ConcatOpHs ByteString 
Instance details

Defined in Lorentz.Polymorphic

SliceOpHs ByteString 
Instance details

Defined in Lorentz.Polymorphic

HasAnnotation ByteString 
Instance details

Defined in Lorentz.Annotation

IsoValue ByteString 
Instance details

Defined in Michelson.Typed.Haskell.Value

Associated Types

type ToT ByteString :: T #

TypeHasDoc ByteString 
Instance details

Defined in Michelson.Typed.Haskell.Doc

Stream ByteString 
Instance details

Defined in Text.Megaparsec.Stream

Associated Types

type Token ByteString #

type Tokens ByteString #

One ByteString 
Instance details

Defined in Universum.Container.Class

Associated Types

type OneItem ByteString #

Container ByteString 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element ByteString #

Print ByteString 
Instance details

Defined in Universum.Print.Internal

Methods

hPutStr :: Handle -> ByteString -> IO () #

hPutStrLn :: Handle -> ByteString -> IO () #

ConvertUtf8 String ByteString 
Instance details

Defined in Universum.String.Conversion

ConvertUtf8 Text ByteString 
Instance details

Defined in Universum.String.Conversion

ConvertUtf8 Text ByteString 
Instance details

Defined in Universum.String.Conversion

type State ByteString 
Instance details

Defined in Data.Attoparsec.Internal.Types

type State ByteString = Buffer
type ChunkElem ByteString 
Instance details

Defined in Data.Attoparsec.Internal.Types

type Index ByteString 
Instance details

Defined in Control.Lens.At

type IxValue ByteString 
Instance details

Defined in Control.Lens.At

type ToT ByteString 
Instance details

Defined in Michelson.Typed.Haskell.Value

type TypeDocFieldDescriptions ByteString 
Instance details

Defined in Michelson.Typed.Haskell.Doc

type Tokens ByteString 
Instance details

Defined in Text.Megaparsec.Stream

type Token ByteString 
Instance details

Defined in Text.Megaparsec.Stream

type OneItem ByteString 
Instance details

Defined in Universum.Container.Class

type Element ByteString 
Instance details

Defined in Universum.Container.Class

(<$>) :: Functor f => (a -> b) -> f a -> f b infixl 4 #

An infix synonym for fmap.

The name of this operator is an allusion to $. Note the similarities between their types:

 ($)  ::              (a -> b) ->   a ->   b
(<$>) :: Functor f => (a -> b) -> f a -> f b

Whereas $ is function application, <$> is function application lifted over a Functor.

Examples

Expand

Convert from a Maybe Int to a Maybe String using show:

>>> show <$> Nothing
Nothing
>>> show <$> Just 3
Just "3"

Convert from an Either Int Int to an Either Int String using show:

>>> show <$> Left 17
Left 17
>>> show <$> Right 17
Right "17"

Double each element of a list:

>>> (*2) <$> [1,2,3]
[2,4,6]

Apply even to the second element of a pair:

>>> even <$> (2,2)
(2,True)

class Hashable a where #

The class of types that can be converted to a hash value.

Minimal implementation: hashWithSalt.

Minimal complete definition

Nothing

Methods

hashWithSalt :: Int -> a -> Int infixl 0 #

Return a hash value for the argument, using the given salt.

The general contract of hashWithSalt is:

  • If two values are equal according to the == method, then applying the hashWithSalt method on each of the two values must produce the same integer result if the same salt is used in each case.
  • It is not required that if two values are unequal according to the == method, then applying the hashWithSalt method on each of the two values must produce distinct integer results. However, the programmer should be aware that producing distinct integer results for unequal values may improve the performance of hashing-based data structures.
  • This method can be used to compute different hash values for the same input by providing a different salt in each application of the method. This implies that any instance that defines hashWithSalt must make use of the salt in its implementation.

Instances

Instances details
Hashable Bool 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Bool -> Int #

hash :: Bool -> Int #

Hashable Char 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Char -> Int #

hash :: Char -> Int #

Hashable Double

Note: prior to hashable-1.3.0.0, hash 0.0 /= hash (-0.0)

The hash of NaN is not well defined.

Since: hashable-1.3.0.0

Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Double -> Int #

hash :: Double -> Int #

Hashable Float

Note: prior to hashable-1.3.0.0, hash 0.0 /= hash (-0.0)

The hash of NaN is not well defined.

Since: hashable-1.3.0.0

Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Float -> Int #

hash :: Float -> Int #

Hashable Int 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Int -> Int #

hash :: Int -> Int #

Hashable Int8 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Int8 -> Int #

hash :: Int8 -> Int #

Hashable Int16 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Int16 -> Int #

hash :: Int16 -> Int #

Hashable Int32 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Int32 -> Int #

hash :: Int32 -> Int #

Hashable Int64 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Int64 -> Int #

hash :: Int64 -> Int #

Hashable Integer 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Integer -> Int #

hash :: Integer -> Int #

Hashable Natural 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Natural -> Int #

hash :: Natural -> Int #

Hashable Ordering 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Ordering -> Int #

hash :: Ordering -> Int #

Hashable Word 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Word -> Int #

hash :: Word -> Int #

Hashable Word8 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Word8 -> Int #

hash :: Word8 -> Int #

Hashable Word16 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Word16 -> Int #

hash :: Word16 -> Int #

Hashable Word32 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Word32 -> Int #

hash :: Word32 -> Int #

Hashable Word64 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Word64 -> Int #

hash :: Word64 -> Int #

Hashable SomeTypeRep 
Instance details

Defined in Data.Hashable.Class

Hashable () 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> () -> Int #

hash :: () -> Int #

Hashable Version 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Version -> Int #

hash :: Version -> Int #

Hashable ByteString 
Instance details

Defined in Data.Hashable.Class

Hashable ByteString 
Instance details

Defined in Data.Hashable.Class

Hashable Scientific

A hash can be safely calculated from a Scientific. No magnitude 10^e is calculated so there's no risk of a blowup in space or time when hashing scientific numbers coming from untrusted sources.

Instance details

Defined in Data.Scientific

Hashable Text 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Text -> Int #

hash :: Text -> Int #

Hashable Value 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

hashWithSalt :: Int -> Value -> Int #

hash :: Value -> Int #

Hashable Text 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Text -> Int #

hash :: Text -> Int #

Hashable BigNat 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> BigNat -> Int #

hash :: BigNat -> Int #

Hashable Void 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Void -> Int #

hash :: Void -> Int #

Hashable Unique 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Unique -> Int #

hash :: Unique -> Int #

Hashable ThreadId 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> ThreadId -> Int #

hash :: ThreadId -> Int #

Hashable WordPtr 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> WordPtr -> Int #

hash :: WordPtr -> Int #

Hashable IntPtr 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> IntPtr -> Int #

hash :: IntPtr -> Int #

Hashable Fingerprint

Since: hashable-1.3.0.0

Instance details

Defined in Data.Hashable.Class

Hashable ShortByteString 
Instance details

Defined in Data.Hashable.Class

Hashable MText 
Instance details

Defined in Michelson.Text

Methods

hashWithSalt :: Int -> MText -> Int #

hash :: MText -> Int #

Hashable UUID 
Instance details

Defined in Data.UUID.Types.Internal

Methods

hashWithSalt :: Int -> UUID -> Int #

hash :: UUID -> Int #

Hashable a => Hashable [a] 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> [a] -> Int #

hash :: [a] -> Int #

Hashable a => Hashable (Maybe a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Maybe a -> Int #

hash :: Maybe a -> Int #

Hashable a => Hashable (Ratio a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Ratio a -> Int #

hash :: Ratio a -> Int #

Hashable (Ptr a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Ptr a -> Int #

hash :: Ptr a -> Int #

Hashable (FunPtr a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> FunPtr a -> Int #

hash :: FunPtr a -> Int #

Hashable a => Hashable (Complex a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Complex a -> Int #

hash :: Complex a -> Int #

Hashable (Fixed a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Fixed a -> Int #

hash :: Fixed a -> Int #

Hashable a => Hashable (Min a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Min a -> Int #

hash :: Min a -> Int #

Hashable a => Hashable (Max a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Max a -> Int #

hash :: Max a -> Int #

Hashable a => Hashable (First a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> First a -> Int #

hash :: First a -> Int #

Hashable a => Hashable (Last a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Last a -> Int #

hash :: Last a -> Int #

Hashable a => Hashable (WrappedMonoid a) 
Instance details

Defined in Data.Hashable.Class

Hashable a => Hashable (Option a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Option a -> Int #

hash :: Option a -> Int #

Hashable (StableName a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> StableName a -> Int #

hash :: StableName a -> Int #

Hashable a => Hashable (Identity a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Identity a -> Int #

hash :: Identity a -> Int #

Hashable a => Hashable (NonEmpty a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> NonEmpty a -> Int #

hash :: NonEmpty a -> Int #

Hashable (Hashed a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Hashed a -> Int #

hash :: Hashed a -> Int #

Hashable a => Hashable (HashSet a) 
Instance details

Defined in Data.HashSet.Base

Methods

hashWithSalt :: Int -> HashSet a -> Int #

hash :: HashSet a -> Int #

(Hashable a, Hashable b) => Hashable (Either a b) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Either a b -> Int #

hash :: Either a b -> Int #

Hashable (TypeRep a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> TypeRep a -> Int #

hash :: TypeRep a -> Int #

(Hashable a1, Hashable a2) => Hashable (a1, a2) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> (a1, a2) -> Int #

hash :: (a1, a2) -> Int #

(Hashable k, Hashable v) => Hashable (HashMap k v) 
Instance details

Defined in Data.HashMap.Base

Methods

hashWithSalt :: Int -> HashMap k v -> Int #

hash :: HashMap k v -> Int #

Hashable a => Hashable (Arg a b)

Note: Prior to hashable-1.3.0.0 the hash computation included the second argument of Arg which wasn't consistent with its Eq instance.

Since: hashable-1.3.0.0

Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Arg a b -> Int #

hash :: Arg a b -> Int #

Hashable (Proxy a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Proxy a -> Int #

hash :: Proxy a -> Int #

(Hashable a1, Hashable a2, Hashable a3) => Hashable (a1, a2, a3) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> (a1, a2, a3) -> Int #

hash :: (a1, a2, a3) -> Int #

Hashable a => Hashable (Const a b) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Const a b -> Int #

hash :: Const a b -> Int #

(Hashable a1, Hashable a2, Hashable a3, Hashable a4) => Hashable (a1, a2, a3, a4) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> (a1, a2, a3, a4) -> Int #

hash :: (a1, a2, a3, a4) -> Int #

(Hashable1 f, Hashable1 g, Hashable a) => Hashable (Product f g a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Product f g a -> Int #

hash :: Product f g a -> Int #

(Hashable1 f, Hashable1 g, Hashable a) => Hashable (Sum f g a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Sum f g a -> Int #

hash :: Sum f g a -> Int #

(Hashable a1, Hashable a2, Hashable a3, Hashable a4, Hashable a5) => Hashable (a1, a2, a3, a4, a5) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> (a1, a2, a3, a4, a5) -> Int #

hash :: (a1, a2, a3, a4, a5) -> Int #

(Hashable1 f, Hashable1 g, Hashable a) => Hashable (Compose f g a)

In general, hash (Compose x) ≠ hash x. However, hashWithSalt satisfies its variant of this equivalence.

Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Compose f g a -> Int #

hash :: Compose f g a -> Int #

(Hashable a1, Hashable a2, Hashable a3, Hashable a4, Hashable a5, Hashable a6) => Hashable (a1, a2, a3, a4, a5, a6) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> (a1, a2, a3, a4, a5, a6) -> Int #

hash :: (a1, a2, a3, a4, a5, a6) -> Int #

(Hashable a1, Hashable a2, Hashable a3, Hashable a4, Hashable a5, Hashable a6, Hashable a7) => Hashable (a1, a2, a3, a4, a5, a6, a7) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> (a1, a2, a3, a4, a5, a6, a7) -> Int #

hash :: (a1, a2, a3, a4, a5, a6, a7) -> Int #

data Text #

A space efficient, packed, unboxed Unicode text type.

Instances

Instances details
Hashable Text 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Text -> Int #

hash :: Text -> Int #

Chunk Text 
Instance details

Defined in Data.Attoparsec.Internal.Types

Associated Types

type ChunkElem Text #

Ixed Text 
Instance details

Defined in Control.Lens.At

(DoNotUseTextError :: Constraint) => IsoValue Text 
Instance details

Defined in Michelson.Typed.Haskell.Value

Associated Types

type ToT Text :: T #

Methods

toVal :: Text -> Value (ToT Text) #

fromVal :: Value (ToT Text) -> Text #

Stream Text 
Instance details

Defined in Text.Megaparsec.Stream

Associated Types

type Token Text #

type Tokens Text #

ToAnchor Text 
Instance details

Defined in Util.Markdown

Methods

toAnchor :: Text -> Anchor #

One Text 
Instance details

Defined in Universum.Container.Class

Associated Types

type OneItem Text #

Methods

one :: OneItem Text -> Text #

Container Text 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element Text #

Methods

toList :: Text -> [Element Text] #

null :: Text -> Bool #

foldr :: (Element Text -> b -> b) -> b -> Text -> b #

foldl :: (b -> Element Text -> b) -> b -> Text -> b #

foldl' :: (b -> Element Text -> b) -> b -> Text -> b #

length :: Text -> Int #

elem :: Element Text -> Text -> Bool #

maximum :: Text -> Element Text #

minimum :: Text -> Element Text #

foldMap :: Monoid m => (Element Text -> m) -> Text -> m #

fold :: Text -> Element Text #

foldr' :: (Element Text -> b -> b) -> b -> Text -> b #

foldr1 :: (Element Text -> Element Text -> Element Text) -> Text -> Element Text #

foldl1 :: (Element Text -> Element Text -> Element Text) -> Text -> Element Text #

notElem :: Element Text -> Text -> Bool #

all :: (Element Text -> Bool) -> Text -> Bool #

any :: (Element Text -> Bool) -> Text -> Bool #

and :: Text -> Bool #

or :: Text -> Bool #

find :: (Element Text -> Bool) -> Text -> Maybe (Element Text) #

safeHead :: Text -> Maybe (Element Text) #

Print Text 
Instance details

Defined in Universum.Print.Internal

Methods

hPutStr :: Handle -> Text -> IO () #

hPutStrLn :: Handle -> Text -> IO () #

ToString Text 
Instance details

Defined in Universum.String.Conversion

Methods

toString :: Text -> String #

ToLText Text 
Instance details

Defined in Universum.String.Conversion

Methods

toLText :: Text -> Text0 #

ToText Text 
Instance details

Defined in Universum.String.Conversion

Methods

toText :: Text -> Text #

ConvertUtf8 Text ByteString 
Instance details

Defined in Universum.String.Conversion

ConvertUtf8 Text ByteString 
Instance details

Defined in Universum.String.Conversion

type State Text 
Instance details

Defined in Data.Attoparsec.Internal.Types

type State Text = Buffer
type ChunkElem Text 
Instance details

Defined in Data.Attoparsec.Internal.Types

type Item Text 
Instance details

Defined in Data.Text

type Item Text = Char
type Index Text 
Instance details

Defined in Control.Lens.At

type Index Text = Int
type IxValue Text 
Instance details

Defined in Control.Lens.At

type ToT Text 
Instance details

Defined in Michelson.Typed.Haskell.Value

type ToT Text = ToT MText
type Tokens Text 
Instance details

Defined in Text.Megaparsec.Stream

type Token Text 
Instance details

Defined in Text.Megaparsec.Stream

type Token Text = Char
type OneItem Text 
Instance details

Defined in Universum.Container.Class

type Element Text 
Instance details

Defined in Universum.Container.Class

const :: a -> b -> a #

const x is a unary function which evaluates to x for all inputs.

>>> const 42 "hello"
42
>>> map (const 42) [0..3]
[42,42,42,42]

(.) :: (b -> c) -> (a -> b) -> a -> c infixr 9 #

Function composition.

data HashMap k v #

A map from keys to values. A map cannot contain duplicate keys; each key can map to at most one value.

Instances

Instances details
Eq2 HashMap 
Instance details

Defined in Data.HashMap.Base

Methods

liftEq2 :: (a -> b -> Bool) -> (c -> d -> Bool) -> HashMap a c -> HashMap b d -> Bool #

Ord2 HashMap 
Instance details

Defined in Data.HashMap.Base

Methods

liftCompare2 :: (a -> b -> Ordering) -> (c -> d -> Ordering) -> HashMap a c -> HashMap b d -> Ordering #

Show2 HashMap 
Instance details

Defined in Data.HashMap.Base

Methods

liftShowsPrec2 :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> (Int -> b -> ShowS) -> ([b] -> ShowS) -> Int -> HashMap a b -> ShowS #

liftShowList2 :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> (Int -> b -> ShowS) -> ([b] -> ShowS) -> [HashMap a b] -> ShowS #

Hashable2 HashMap 
Instance details

Defined in Data.HashMap.Base

Methods

liftHashWithSalt2 :: (Int -> a -> Int) -> (Int -> b -> Int) -> Int -> HashMap a b -> Int #

Functor (HashMap k) 
Instance details

Defined in Data.HashMap.Base

Methods

fmap :: (a -> b) -> HashMap k a -> HashMap k b #

(<$) :: a -> HashMap k b -> HashMap k a #

Foldable (HashMap k) 
Instance details

Defined in Data.HashMap.Base

Methods

fold :: Monoid m => HashMap k m -> m #

foldMap :: Monoid m => (a -> m) -> HashMap k a -> m #

foldMap' :: Monoid m => (a -> m) -> HashMap k a -> m #

foldr :: (a -> b -> b) -> b -> HashMap k a -> b #

foldr' :: (a -> b -> b) -> b -> HashMap k a -> b #

foldl :: (b -> a -> b) -> b -> HashMap k a -> b #

foldl' :: (b -> a -> b) -> b -> HashMap k a -> b #

foldr1 :: (a -> a -> a) -> HashMap k a -> a #

foldl1 :: (a -> a -> a) -> HashMap k a -> a #

toList :: HashMap k a -> [a] #

null :: HashMap k a -> Bool #

length :: HashMap k a -> Int #

elem :: Eq a => a -> HashMap k a -> Bool #

maximum :: Ord a => HashMap k a -> a #

minimum :: Ord a => HashMap k a -> a #

sum :: Num a => HashMap k a -> a #

product :: Num a => HashMap k a -> a #

Traversable (HashMap k) 
Instance details

Defined in Data.HashMap.Base

Methods

traverse :: Applicative f => (a -> f b) -> HashMap k a -> f (HashMap k b) #

sequenceA :: Applicative f => HashMap k (f a) -> f (HashMap k a) #

mapM :: Monad m => (a -> m b) -> HashMap k a -> m (HashMap k b) #

sequence :: Monad m => HashMap k (m a) -> m (HashMap k a) #

Eq k => Eq1 (HashMap k) 
Instance details

Defined in Data.HashMap.Base

Methods

liftEq :: (a -> b -> Bool) -> HashMap k a -> HashMap k b -> Bool #

Ord k => Ord1 (HashMap k) 
Instance details

Defined in Data.HashMap.Base

Methods

liftCompare :: (a -> b -> Ordering) -> HashMap k a -> HashMap k b -> Ordering #

(Eq k, Hashable k, Read k) => Read1 (HashMap k) 
Instance details

Defined in Data.HashMap.Base

Methods

liftReadsPrec :: (Int -> ReadS a) -> ReadS [a] -> Int -> ReadS (HashMap k a) #

liftReadList :: (Int -> ReadS a) -> ReadS [a] -> ReadS [HashMap k a] #

liftReadPrec :: ReadPrec a -> ReadPrec [a] -> ReadPrec (HashMap k a) #

liftReadListPrec :: ReadPrec a -> ReadPrec [a] -> ReadPrec [HashMap k a] #

Show k => Show1 (HashMap k) 
Instance details

Defined in Data.HashMap.Base

Methods

liftShowsPrec :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> Int -> HashMap k a -> ShowS #

liftShowList :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> [HashMap k a] -> ShowS #

Hashable k => Hashable1 (HashMap k) 
Instance details

Defined in Data.HashMap.Base

Methods

liftHashWithSalt :: (Int -> a -> Int) -> Int -> HashMap k a -> Int #

(Eq k, Hashable k) => IsList (HashMap k v) 
Instance details

Defined in Data.HashMap.Base

Associated Types

type Item (HashMap k v) #

Methods

fromList :: [Item (HashMap k v)] -> HashMap k v #

fromListN :: Int -> [Item (HashMap k v)] -> HashMap k v #

toList :: HashMap k v -> [Item (HashMap k v)] #

(Eq k, Eq v) => Eq (HashMap k v) 
Instance details

Defined in Data.HashMap.Base

Methods

(==) :: HashMap k v -> HashMap k v -> Bool #

(/=) :: HashMap k v -> HashMap k v -> Bool #

(Data k, Data v, Eq k, Hashable k) => Data (HashMap k v) 
Instance details

Defined in Data.HashMap.Base

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> HashMap k v -> c (HashMap k v) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (HashMap k v) #

toConstr :: HashMap k v -> Constr #

dataTypeOf :: HashMap k v -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (HashMap k v)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (HashMap k v)) #

gmapT :: (forall b. Data b => b -> b) -> HashMap k v -> HashMap k v #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> HashMap k v -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> HashMap k v -> r #

gmapQ :: (forall d. Data d => d -> u) -> HashMap k v -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> HashMap k v -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> HashMap k v -> m (HashMap k v) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> HashMap k v -> m (HashMap k v) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> HashMap k v -> m (HashMap k v) #

(Ord k, Ord v) => Ord (HashMap k v)

The order is total.

Note: Because the hash is not guaranteed to be stable across library versions, OSes, or architectures, neither is an actual order of elements in HashMap or an result of compare.is stable.

Instance details

Defined in Data.HashMap.Base

Methods

compare :: HashMap k v -> HashMap k v -> Ordering #

(<) :: HashMap k v -> HashMap k v -> Bool #

(<=) :: HashMap k v -> HashMap k v -> Bool #

(>) :: HashMap k v -> HashMap k v -> Bool #

(>=) :: HashMap k v -> HashMap k v -> Bool #

max :: HashMap k v -> HashMap k v -> HashMap k v #

min :: HashMap k v -> HashMap k v -> HashMap k v #

(Eq k, Hashable k, Read k, Read e) => Read (HashMap k e) 
Instance details

Defined in Data.HashMap.Base

(Show k, Show v) => Show (HashMap k v) 
Instance details

Defined in Data.HashMap.Base

Methods

showsPrec :: Int -> HashMap k v -> ShowS #

show :: HashMap k v -> String #

showList :: [HashMap k v] -> ShowS #

(Eq k, Hashable k) => Semigroup (HashMap k v) 
Instance details

Defined in Data.HashMap.Base

Methods

(<>) :: HashMap k v -> HashMap k v -> HashMap k v #

sconcat :: NonEmpty (HashMap k v) -> HashMap k v #

stimes :: Integral b => b -> HashMap k v -> HashMap k v #

(Eq k, Hashable k) => Monoid (HashMap k v) 
Instance details

Defined in Data.HashMap.Base

Methods

mempty :: HashMap k v #

mappend :: HashMap k v -> HashMap k v -> HashMap k v #

mconcat :: [HashMap k v] -> HashMap k v #

(Hashable k, Hashable v) => Hashable (HashMap k v) 
Instance details

Defined in Data.HashMap.Base

Methods

hashWithSalt :: Int -> HashMap k v -> Int #

hash :: HashMap k v -> Int #

(NFData k, NFData v) => NFData (HashMap k v) 
Instance details

Defined in Data.HashMap.Base

Methods

rnf :: HashMap k v -> () #

(Eq k, Hashable k) => Ixed (HashMap k a) 
Instance details

Defined in Control.Lens.At

Methods

ix :: Index (HashMap k a) -> Traversal' (HashMap k a) (IxValue (HashMap k a)) #

(Eq k, Hashable k) => At (HashMap k a) 
Instance details

Defined in Control.Lens.At

Methods

at :: Index (HashMap k a) -> Lens' (HashMap k a) (Maybe (IxValue (HashMap k a))) #

(Hashable k, Eq k) => Wrapped (HashMap k a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (HashMap k a) #

Methods

_Wrapped' :: Iso' (HashMap k a) (Unwrapped (HashMap k a)) #

Hashable k => One (HashMap k v) 
Instance details

Defined in Universum.Container.Class

Associated Types

type OneItem (HashMap k v) #

Methods

one :: OneItem (HashMap k v) -> HashMap k v #

Container (HashMap k v) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element (HashMap k v) #

Methods

toList :: HashMap k v -> [Element (HashMap k v)] #

null :: HashMap k v -> Bool #

foldr :: (Element (HashMap k v) -> b -> b) -> b -> HashMap k v -> b #

foldl :: (b -> Element (HashMap k v) -> b) -> b -> HashMap k v -> b #

foldl' :: (b -> Element (HashMap k v) -> b) -> b -> HashMap k v -> b #

length :: HashMap k v -> Int #

elem :: Element (HashMap k v) -> HashMap k v -> Bool #

maximum :: HashMap k v -> Element (HashMap k v) #

minimum :: HashMap k v -> Element (HashMap k v) #

foldMap :: Monoid m => (Element (HashMap k v) -> m) -> HashMap k v -> m #

fold :: HashMap k v -> Element (HashMap k v) #

foldr' :: (Element (HashMap k v) -> b -> b) -> b -> HashMap k v -> b #

foldr1 :: (Element (HashMap k v) -> Element (HashMap k v) -> Element (HashMap k v)) -> HashMap k v -> Element (HashMap k v) #

foldl1 :: (Element (HashMap k v) -> Element (HashMap k v) -> Element (HashMap k v)) -> HashMap k v -> Element (HashMap k v) #

notElem :: Element (HashMap k v) -> HashMap k v -> Bool #

all :: (Element (HashMap k v) -> Bool) -> HashMap k v -> Bool #

any :: (Element (HashMap k v) -> Bool) -> HashMap k v -> Bool #

and :: HashMap k v -> Bool #

or :: HashMap k v -> Bool #

find :: (Element (HashMap k v) -> Bool) -> HashMap k v -> Maybe (Element (HashMap k v)) #

safeHead :: HashMap k v -> Maybe (Element (HashMap k v)) #

ToPairs (HashMap k v) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Key (HashMap k v) #

type Val (HashMap k v) #

Methods

toPairs :: HashMap k v -> [(Key (HashMap k v), Val (HashMap k v))] #

keys :: HashMap k v -> [Key (HashMap k v)] #

elems :: HashMap k v -> [Val (HashMap k v)] #

(t ~ HashMap k' a', Hashable k, Eq k) => Rewrapped (HashMap k a) t

Use wrapping fromList. Unwrapping returns some permutation of the list.

Instance details

Defined in Control.Lens.Wrapped

type Item (HashMap k v) 
Instance details

Defined in Data.HashMap.Base

type Item (HashMap k v) = (k, v)
type Index (HashMap k a) 
Instance details

Defined in Control.Lens.At

type Index (HashMap k a) = k
type IxValue (HashMap k a) 
Instance details

Defined in Control.Lens.At

type IxValue (HashMap k a) = a
type Unwrapped (HashMap k a) 
Instance details

Defined in Control.Lens.Wrapped

type Unwrapped (HashMap k a) = [(k, a)]
type OneItem (HashMap k v) 
Instance details

Defined in Universum.Container.Class

type OneItem (HashMap k v) = (k, v)
type Element (HashMap k v) 
Instance details

Defined in Universum.Container.Class

type Element (HashMap k v) = ElementDefault (HashMap k v)
type Val (HashMap k v) 
Instance details

Defined in Universum.Container.Class

type Val (HashMap k v) = v
type Key (HashMap k v) 
Instance details

Defined in Universum.Container.Class

type Key (HashMap k v) = k

data Map k a #

A Map from keys k to values a.

The Semigroup operation for Map is union, which prefers values from the left operand. If m1 maps a key k to a value a1, and m2 maps the same key to a different value a2, then their union m1 <> m2 maps k to a1.

Instances

Instances details
Eq2 Map

Since: containers-0.5.9

Instance details

Defined in Data.Map.Internal

Methods

liftEq2 :: (a -> b -> Bool) -> (c -> d -> Bool) -> Map a c -> Map b d -> Bool #

Ord2 Map

Since: containers-0.5.9

Instance details

Defined in Data.Map.Internal

Methods

liftCompare2 :: (a -> b -> Ordering) -> (c -> d -> Ordering) -> Map a c -> Map b d -> Ordering #

Show2 Map

Since: containers-0.5.9

Instance details

Defined in Data.Map.Internal

Methods

liftShowsPrec2 :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> (Int -> b -> ShowS) -> ([b] -> ShowS) -> Int -> Map a b -> ShowS #

liftShowList2 :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> (Int -> b -> ShowS) -> ([b] -> ShowS) -> [Map a b] -> ShowS #

MapInstrs Map 
Instance details

Defined in Lorentz.Macro

Methods

mapUpdate :: forall k v (s :: [Type]). NiceComparable k => (k ': (Maybe v ': (Map k v ': s))) :-> (Map k v ': s)

mapInsert :: forall k v (s :: [Type]). NiceComparable k => (k ': (v ': (Map k v ': s))) :-> (Map k v ': s) #

mapInsertNew :: forall k e v (s :: [Type]). (NiceComparable k, KnownValue e) => (forall (s0 :: [Type]). (k ': s0) :-> (e ': s0)) -> (k ': (v ': (Map k v ': s))) :-> (Map k v ': s) #

deleteMap :: forall k v (s :: [Type]). (NiceComparable k, KnownValue v) => (k ': (Map k v ': s)) :-> (Map k v ': s) #

Functor (Map k) 
Instance details

Defined in Data.Map.Internal

Methods

fmap :: (a -> b) -> Map k a -> Map k b #

(<$) :: a -> Map k b -> Map k a #

Foldable (Map k)

Folds in order of increasing key.

Instance details

Defined in Data.Map.Internal

Methods

fold :: Monoid m => Map k m -> m #

foldMap :: Monoid m => (a -> m) -> Map k a -> m #

foldMap' :: Monoid m => (a -> m) -> Map k a -> m #

foldr :: (a -> b -> b) -> b -> Map k a -> b #

foldr' :: (a -> b -> b) -> b -> Map k a -> b #

foldl :: (b -> a -> b) -> b -> Map k a -> b #

foldl' :: (b -> a -> b) -> b -> Map k a -> b #

foldr1 :: (a -> a -> a) -> Map k a -> a #

foldl1 :: (a -> a -> a) -> Map k a -> a #

toList :: Map k a -> [a] #

null :: Map k a -> Bool #

length :: Map k a -> Int #

elem :: Eq a => a -> Map k a -> Bool #

maximum :: Ord a => Map k a -> a #

minimum :: Ord a => Map k a -> a #

sum :: Num a => Map k a -> a #

product :: Num a => Map k a -> a #

Traversable (Map k)

Traverses in order of increasing key.

Instance details

Defined in Data.Map.Internal

Methods

traverse :: Applicative f => (a -> f b) -> Map k a -> f (Map k b) #

sequenceA :: Applicative f => Map k (f a) -> f (Map k a) #

mapM :: Monad m => (a -> m b) -> Map k a -> m (Map k b) #

sequence :: Monad m => Map k (m a) -> m (Map k a) #

Eq k => Eq1 (Map k)

Since: containers-0.5.9

Instance details

Defined in Data.Map.Internal

Methods

liftEq :: (a -> b -> Bool) -> Map k a -> Map k b -> Bool #

Ord k => Ord1 (Map k)

Since: containers-0.5.9

Instance details

Defined in Data.Map.Internal

Methods

liftCompare :: (a -> b -> Ordering) -> Map k a -> Map k b -> Ordering #

(Ord k, Read k) => Read1 (Map k)

Since: containers-0.5.9

Instance details

Defined in Data.Map.Internal

Methods

liftReadsPrec :: (Int -> ReadS a) -> ReadS [a] -> Int -> ReadS (Map k a) #

liftReadList :: (Int -> ReadS a) -> ReadS [a] -> ReadS [Map k a] #

liftReadPrec :: ReadPrec a -> ReadPrec [a] -> ReadPrec (Map k a) #

liftReadListPrec :: ReadPrec a -> ReadPrec [a] -> ReadPrec [Map k a] #

Show k => Show1 (Map k)

Since: containers-0.5.9

Instance details

Defined in Data.Map.Internal

Methods

liftShowsPrec :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> Int -> Map k a -> ShowS #

liftShowList :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> [Map k a] -> ShowS #

(CanCastTo k1 k2, CanCastTo v1 v2) => CanCastTo (Map k1 v1 :: Type) (Map k2 v2 :: Type) 
Instance details

Defined in Lorentz.Coercions

Methods

castDummy :: Proxy (Map k1 v1) -> Proxy (Map k2 v2) -> () #

Ord k => IsList (Map k v)

Since: containers-0.5.6.2

Instance details

Defined in Data.Map.Internal

Associated Types

type Item (Map k v) #

Methods

fromList :: [Item (Map k v)] -> Map k v #

fromListN :: Int -> [Item (Map k v)] -> Map k v #

toList :: Map k v -> [Item (Map k v)] #

(Eq k, Eq a) => Eq (Map k a) 
Instance details

Defined in Data.Map.Internal

Methods

(==) :: Map k a -> Map k a -> Bool #

(/=) :: Map k a -> Map k a -> Bool #

(Data k, Data a, Ord k) => Data (Map k a) 
Instance details

Defined in Data.Map.Internal

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Map k a -> c (Map k a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Map k a) #

toConstr :: Map k a -> Constr #

dataTypeOf :: Map k a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Map k a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Map k a)) #

gmapT :: (forall b. Data b => b -> b) -> Map k a -> Map k a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Map k a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Map k a -> r #

gmapQ :: (forall d. Data d => d -> u) -> Map k a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Map k a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Map k a -> m (Map k a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Map k a -> m (Map k a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Map k a -> m (Map k a) #

(Ord k, Ord v) => Ord (Map k v) 
Instance details

Defined in Data.Map.Internal

Methods

compare :: Map k v -> Map k v -> Ordering #

(<) :: Map k v -> Map k v -> Bool #

(<=) :: Map k v -> Map k v -> Bool #

(>) :: Map k v -> Map k v -> Bool #

(>=) :: Map k v -> Map k v -> Bool #

max :: Map k v -> Map k v -> Map k v #

min :: Map k v -> Map k v -> Map k v #

(Ord k, Read k, Read e) => Read (Map k e) 
Instance details

Defined in Data.Map.Internal

Methods

readsPrec :: Int -> ReadS (Map k e) #

readList :: ReadS [Map k e] #

readPrec :: ReadPrec (Map k e) #

readListPrec :: ReadPrec [Map k e] #

(Show k, Show a) => Show (Map k a) 
Instance details

Defined in Data.Map.Internal

Methods

showsPrec :: Int -> Map k a -> ShowS #

show :: Map k a -> String #

showList :: [Map k a] -> ShowS #

Ord k => Semigroup (Map k v) 
Instance details

Defined in Data.Map.Internal

Methods

(<>) :: Map k v -> Map k v -> Map k v #

sconcat :: NonEmpty (Map k v) -> Map k v #

stimes :: Integral b => b -> Map k v -> Map k v #

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 #

(NFData k, NFData a) => NFData (Map k a) 
Instance details

Defined in Data.Map.Internal

Methods

rnf :: Map k a -> () #

Ord k => Ixed (Map k a) 
Instance details

Defined in Control.Lens.At

Methods

ix :: Index (Map k a) -> Traversal' (Map k a) (IxValue (Map k a)) #

Ord k => At (Map k a) 
Instance details

Defined in Control.Lens.At

Methods

at :: Index (Map k a) -> Lens' (Map k a) (Maybe (IxValue (Map k a))) #

Ord k => Wrapped (Map k a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (Map k a) #

Methods

_Wrapped' :: Iso' (Map k a) (Unwrapped (Map k a)) #

NiceComparable k => MemOpHs (Map k v) 
Instance details

Defined in Lorentz.Polymorphic

Associated Types

type MemOpKeyHs (Map k v) #

NiceComparable k => MapOpHs (Map k v) 
Instance details

Defined in Lorentz.Polymorphic

Associated Types

type MapOpInpHs (Map k v) #

type MapOpResHs (Map k v) :: Type -> Type #

NiceComparable k => IterOpHs (Map k v) 
Instance details

Defined in Lorentz.Polymorphic

Associated Types

type IterOpElHs (Map k v) #

SizeOpHs (Map k v) 
Instance details

Defined in Lorentz.Polymorphic

NiceComparable k => UpdOpHs (Map k v) 
Instance details

Defined in Lorentz.Polymorphic

Associated Types

type UpdOpKeyHs (Map k v) #

type UpdOpParamsHs (Map k v) #

NiceComparable k => GetOpHs (Map k v) 
Instance details

Defined in Lorentz.Polymorphic

Associated Types

type GetOpKeyHs (Map k v) #

type GetOpValHs (Map k v) #

(HasAnnotation k, HasAnnotation v) => HasAnnotation (Map k v) 
Instance details

Defined in Lorentz.Annotation

Methods

getAnnotation :: Notes (ToT (Map k v)) #

(Comparable (ToT k), Ord k, IsoValue k, IsoValue v) => IsoValue (Map k v) 
Instance details

Defined in Michelson.Typed.Haskell.Value

Associated Types

type ToT (Map k v) :: T #

Methods

toVal :: Map k v -> Value (ToT (Map k v)) #

fromVal :: Value (ToT (Map k v)) -> Map k v #

(PolyCTypeHasDocC '[k], PolyTypeHasDocC '[v], Ord k) => TypeHasDoc (Map k v) 
Instance details

Defined in Michelson.Typed.Haskell.Doc

Associated Types

type TypeDocFieldDescriptions (Map k v) :: FieldDescriptions #

One (Map k v) 
Instance details

Defined in Universum.Container.Class

Associated Types

type OneItem (Map k v) #

Methods

one :: OneItem (Map k v) -> Map k v #

Container (Map k v) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element (Map k v) #

Methods

toList :: Map k v -> [Element (Map k v)] #

null :: Map k v -> Bool #

foldr :: (Element (Map k v) -> b -> b) -> b -> Map k v -> b #

foldl :: (b -> Element (Map k v) -> b) -> b -> Map k v -> b #

foldl' :: (b -> Element (Map k v) -> b) -> b -> Map k v -> b #

length :: Map k v -> Int #

elem :: Element (Map k v) -> Map k v -> Bool #

maximum :: Map k v -> Element (Map k v) #

minimum :: Map k v -> Element (Map k v) #

foldMap :: Monoid m => (Element (Map k v) -> m) -> Map k v -> m #

fold :: Map k v -> Element (Map k v) #

foldr' :: (Element (Map k v) -> b -> b) -> b -> Map k v -> b #

foldr1 :: (Element (Map k v) -> Element (Map k v) -> Element (Map k v)) -> Map k v -> Element (Map k v) #

foldl1 :: (Element (Map k v) -> Element (Map k v) -> Element (Map k v)) -> Map k v -> Element (Map k v) #

notElem :: Element (Map k v) -> Map k v -> Bool #

all :: (Element (Map k v) -> Bool) -> Map k v -> Bool #

any :: (Element (Map k v) -> Bool) -> Map k v -> Bool #

and :: Map k v -> Bool #

or :: Map k v -> Bool #

find :: (Element (Map k v) -> Bool) -> Map k v -> Maybe (Element (Map k v)) #

safeHead :: Map k v -> Maybe (Element (Map k v)) #

ToPairs (Map k v) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Key (Map k v) #

type Val (Map k v) #

Methods

toPairs :: Map k v -> [(Key (Map k v), Val (Map k v))] #

keys :: Map k v -> [Key (Map k v)] #

elems :: Map k v -> [Val (Map k v)] #

(t ~ Map k' a', Ord k) => Rewrapped (Map k a) t

Use wrapping fromList. unwrapping returns a sorted list.

Instance details

Defined in Control.Lens.Wrapped

(key ~ key', value ~ value', NiceComparable key) => StoreHasSubmap (Map key' value') name key value

Map can be used as standalone key-value storage if very needed.

Instance details

Defined in Lorentz.StoreClass

Methods

storeSubmapOps :: StoreSubmapOps (Map key' value') name key value #

type Item (Map k v) 
Instance details

Defined in Data.Map.Internal

type Item (Map k v) = (k, v)
type Index (Map k a) 
Instance details

Defined in Control.Lens.At

type Index (Map k a) = k
type IxValue (Map k a) 
Instance details

Defined in Control.Lens.At

type IxValue (Map k a) = a
type Unwrapped (Map k a) 
Instance details

Defined in Control.Lens.Wrapped

type Unwrapped (Map k a) = [(k, a)]
type MemOpKeyHs (Map k v) 
Instance details

Defined in Lorentz.Polymorphic

type MemOpKeyHs (Map k v) = k
type MapOpResHs (Map k v) 
Instance details

Defined in Lorentz.Polymorphic

type MapOpResHs (Map k v) = Map k
type MapOpInpHs (Map k v) 
Instance details

Defined in Lorentz.Polymorphic

type MapOpInpHs (Map k v) = (k, v)
type IterOpElHs (Map k v) 
Instance details

Defined in Lorentz.Polymorphic

type IterOpElHs (Map k v) = (k, v)
type UpdOpParamsHs (Map k v) 
Instance details

Defined in Lorentz.Polymorphic

type UpdOpParamsHs (Map k v) = Maybe v
type UpdOpKeyHs (Map k v) 
Instance details

Defined in Lorentz.Polymorphic

type UpdOpKeyHs (Map k v) = k
type GetOpValHs (Map k v) 
Instance details

Defined in Lorentz.Polymorphic

type GetOpValHs (Map k v) = v
type GetOpKeyHs (Map k v) 
Instance details

Defined in Lorentz.Polymorphic

type GetOpKeyHs (Map k v) = k
type ToT (Map k v) 
Instance details

Defined in Michelson.Typed.Haskell.Value

type ToT (Map k v) = 'TMap (ToT k) (ToT v)
type TypeDocFieldDescriptions (Map k v) 
Instance details

Defined in Michelson.Typed.Haskell.Doc

type TypeDocFieldDescriptions (Map k v) = '[] :: [(Symbol, (Maybe Symbol, [(Symbol, Symbol)]))]
type OneItem (Map k v) 
Instance details

Defined in Universum.Container.Class

type OneItem (Map k v) = (k, v)
type Element (Map k v) 
Instance details

Defined in Universum.Container.Class

type Element (Map k v) = ElementDefault (Map k v)
type Val (Map k v) 
Instance details

Defined in Universum.Container.Class

type Val (Map k v) = v
type Key (Map k v) 
Instance details

Defined in Universum.Container.Class

type Key (Map k v) = k

stdout :: Handle #

A handle managing output to the Haskell program's standard output channel.

data Handle #

Haskell defines operations to read and write characters from and to files, represented by values of type Handle. Each value of this type is a handle: a record used by the Haskell run-time system to manage I/O with file system objects. A handle has at least the following properties:

  • whether it manages input or output or both;
  • whether it is open, closed or semi-closed;
  • whether the object is seekable;
  • whether buffering is disabled, or enabled on a line or block basis;
  • a buffer (whose length may be zero).

Most handles will also have a current I/O position indicating where the next input or output operation will occur. A handle is readable if it manages only input or both input and output; likewise, it is writable if it manages only output or both input and output. A handle is open when first allocated. Once it is closed it can no longer be used for either input or output, though an implementation cannot re-use its storage while references remain to it. Handles are in the Show and Eq classes. The string produced by showing a handle is system dependent; it should include enough information to identify the handle for debugging. A handle is equal according to == only to itself; no attempt is made to compare the internal state of different handles for equality.

Instances

Instances details
Eq Handle

Since: base-4.1.0.0

Instance details

Defined in GHC.IO.Handle.Types

Methods

(==) :: Handle -> Handle -> Bool #

(/=) :: Handle -> Handle -> Bool #

Show Handle

Since: base-4.1.0.0

Instance details

Defined in GHC.IO.Handle.Types

class Applicative f => Alternative (f :: Type -> Type) where #

A monoid on applicative functors.

If defined, some and many should be the least solutions of the equations:

Minimal complete definition

empty, (<|>)

Methods

(<|>) :: f a -> f a -> f a infixl 3 #

An associative binary operation

many :: f a -> f [a] #

Zero or more.

Instances

Instances details
Alternative []

Since: base-2.1

Instance details

Defined in GHC.Base

Methods

empty :: [a] #

(<|>) :: [a] -> [a] -> [a] #

some :: [a] -> [[a]] #

many :: [a] -> [[a]] #

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] #

Alternative IO

Since: base-4.9.0.0

Instance details

Defined in GHC.Base

Methods

empty :: IO a #

(<|>) :: IO a -> IO a -> IO a #

some :: IO a -> IO [a] #

many :: IO a -> IO [a] #

Alternative IResult 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

empty :: IResult a #

(<|>) :: IResult a -> IResult a -> IResult a #

some :: IResult a -> IResult [a] #

many :: IResult a -> IResult [a] #

Alternative Result 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

empty :: Result a #

(<|>) :: Result a -> Result a -> Result a #

some :: Result a -> Result [a] #

many :: Result a -> Result [a] #

Alternative Parser 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

empty :: Parser a #

(<|>) :: Parser a -> Parser a -> Parser a #

some :: Parser a -> Parser [a] #

many :: Parser a -> Parser [a] #

Alternative Option

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

empty :: Option a #

(<|>) :: Option a -> Option a -> Option a #

some :: Option a -> Option [a] #

many :: Option a -> Option [a] #

Alternative ZipList

Since: base-4.11.0.0

Instance details

Defined in Control.Applicative

Methods

empty :: ZipList a #

(<|>) :: ZipList a -> ZipList a -> ZipList a #

some :: ZipList a -> ZipList [a] #

many :: ZipList a -> ZipList [a] #

Alternative STM

Since: base-4.8.0.0

Instance details

Defined in GHC.Conc.Sync

Methods

empty :: STM a #

(<|>) :: STM a -> STM a -> STM a #

some :: STM a -> STM [a] #

many :: STM a -> STM [a] #

Alternative ReadP

Since: base-4.6.0.0

Instance details

Defined in Text.ParserCombinators.ReadP

Methods

empty :: ReadP a #

(<|>) :: ReadP a -> ReadP a -> ReadP a #

some :: ReadP a -> ReadP [a] #

many :: ReadP a -> ReadP [a] #

Alternative Seq

Since: containers-0.5.4

Instance details

Defined in Data.Sequence.Internal

Methods

empty :: Seq a #

(<|>) :: Seq a -> Seq a -> Seq a #

some :: Seq a -> Seq [a] #

many :: Seq a -> Seq [a] #

Alternative DList 
Instance details

Defined in Data.DList

Methods

empty :: DList a #

(<|>) :: DList a -> DList a -> DList a #

some :: DList a -> DList [a] #

many :: DList a -> DList [a] #

Alternative Vector 
Instance details

Defined in Data.Vector

Methods

empty :: Vector a #

(<|>) :: Vector a -> Vector a -> Vector a #

some :: Vector a -> Vector [a] #

many :: Vector a -> Vector [a] #

Alternative SmallArray 
Instance details

Defined in Data.Primitive.SmallArray

Alternative Array 
Instance details

Defined in Data.Primitive.Array

Methods

empty :: Array a #

(<|>) :: Array a -> Array a -> Array a #

some :: Array a -> Array [a] #

many :: Array a -> Array [a] #

Alternative P

Since: base-4.5.0.0

Instance details

Defined in Text.ParserCombinators.ReadP

Methods

empty :: P a #

(<|>) :: P a -> P a -> P a #

some :: P a -> P [a] #

many :: P a -> P [a] #

() :=> (Alternative []) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Alternative [] #

() :=> (Alternative Maybe) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Alternative Maybe #

Alternative (U1 :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

empty :: U1 a #

(<|>) :: U1 a -> U1 a -> U1 a #

some :: U1 a -> U1 [a] #

many :: U1 a -> U1 [a] #

Alternative (Parser i) 
Instance details

Defined in Data.Attoparsec.Internal.Types

Methods

empty :: Parser i a #

(<|>) :: Parser i a -> Parser i a -> Parser i a #

some :: Parser i a -> Parser i [a] #

many :: Parser i a -> Parser i [a] #

MonadPlus m => Alternative (WrappedMonad m)

Since: base-2.1

Instance details

Defined in Control.Applicative

Methods

empty :: WrappedMonad m a #

(<|>) :: WrappedMonad m a -> WrappedMonad m a -> WrappedMonad m a #

some :: WrappedMonad m a -> WrappedMonad m [a] #

many :: WrappedMonad m a -> WrappedMonad m [a] #

ArrowPlus a => Alternative (ArrowMonad a)

Since: base-4.6.0.0

Instance details

Defined in Control.Arrow

Methods

empty :: ArrowMonad a a0 #

(<|>) :: ArrowMonad a a0 -> ArrowMonad a a0 -> ArrowMonad a a0 #

some :: ArrowMonad a a0 -> ArrowMonad a [a0] #

many :: ArrowMonad a a0 -> ArrowMonad a [a0] #

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] #

(Functor m, Monad m) => Alternative (MaybeT m) 
Instance details

Defined in Control.Monad.Trans.Maybe

Methods

empty :: MaybeT m a #

(<|>) :: MaybeT m a -> MaybeT m a -> MaybeT m a #

some :: MaybeT m a -> MaybeT m [a] #

many :: MaybeT m a -> MaybeT m [a] #

Alternative v => Alternative (Free v)

This violates the Alternative laws, handle with care.

Instance details

Defined in Control.Monad.Free

Methods

empty :: Free v a #

(<|>) :: Free v a -> Free v a -> Free v a #

some :: Free v a -> Free v [a] #

many :: Free v a -> Free v [a] #

Alternative f => Alternative (Yoneda f) 
Instance details

Defined in Data.Functor.Yoneda

Methods

empty :: Yoneda f a #

(<|>) :: Yoneda f a -> Yoneda f a -> Yoneda f a #

some :: Yoneda f a -> Yoneda f [a] #

many :: Yoneda f a -> Yoneda f [a] #

Alternative (ReifiedFold s) 
Instance details

Defined in Control.Lens.Reified

Methods

empty :: ReifiedFold s a #

(<|>) :: ReifiedFold s a -> ReifiedFold s a -> ReifiedFold s a #

some :: ReifiedFold s a -> ReifiedFold s [a] #

many :: ReifiedFold s a -> ReifiedFold s [a] #

Class (Applicative f) (Alternative f) 
Instance details

Defined in Data.Constraint

(MonadPlus m) :=> (Alternative (WrappedMonad m)) 
Instance details

Defined in Data.Constraint

Alternative f => Alternative (Rec1 f)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

empty :: Rec1 f a #

(<|>) :: Rec1 f a -> Rec1 f a -> Rec1 f a #

some :: Rec1 f a -> Rec1 f [a] #

many :: Rec1 f a -> Rec1 f [a] #

(ArrowZero a, ArrowPlus a) => Alternative (WrappedArrow a b)

Since: base-2.1

Instance details

Defined in Control.Applicative

Methods

empty :: WrappedArrow a b a0 #

(<|>) :: WrappedArrow a b a0 -> WrappedArrow a b a0 -> WrappedArrow a b a0 #

some :: WrappedArrow a b a0 -> WrappedArrow a b [a0] #

many :: WrappedArrow a b a0 -> WrappedArrow a b [a0] #

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] #

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] #

Alternative m => Alternative (IdentityT m) 
Instance details

Defined in Control.Monad.Trans.Identity

Methods

empty :: IdentityT m a #

(<|>) :: IdentityT m a -> IdentityT m a -> IdentityT m a #

some :: IdentityT m a -> IdentityT m [a] #

many :: IdentityT m a -> IdentityT m [a] #

(Functor m, Monad m, Monoid e) => Alternative (ExceptT e m) 
Instance details

Defined in Control.Monad.Trans.Except

Methods

empty :: ExceptT e m a #

(<|>) :: ExceptT e m a -> ExceptT e m a -> ExceptT e m a #

some :: ExceptT e m a -> ExceptT e m [a] #

many :: ExceptT e m a -> ExceptT e m [a] #

(Functor f, MonadPlus m) => Alternative (FreeT f m) 
Instance details

Defined in Control.Monad.Trans.Free

Methods

empty :: FreeT f m a #

(<|>) :: FreeT f m a -> FreeT f m a -> FreeT f m a #

some :: FreeT f m a -> FreeT f m [a] #

many :: FreeT f m a -> FreeT f m [a] #

(Functor m, Monad m, Error e) => Alternative (ErrorT e m) 
Instance details

Defined in Control.Monad.Trans.Error

Methods

empty :: ErrorT e m a #

(<|>) :: ErrorT e m a -> ErrorT e m a -> ErrorT e m a #

some :: ErrorT e m a -> ErrorT e m [a] #

many :: ErrorT e m a -> ErrorT e m [a] #

(Functor m, MonadPlus m) => Alternative (StateT s m) 
Instance details

Defined in Control.Monad.Trans.State.Strict

Methods

empty :: StateT s m a #

(<|>) :: StateT s m a -> StateT s m a -> StateT s m a #

some :: StateT s m a -> StateT s m [a] #

many :: StateT s m a -> StateT s m [a] #

Alternative m => Alternative (ReaderT r m) 
Instance details

Defined in Control.Monad.Trans.Reader

Methods

empty :: ReaderT r m a #

(<|>) :: ReaderT r m a -> ReaderT r m a -> ReaderT r m a #

some :: ReaderT r m a -> ReaderT r m [a] #

many :: ReaderT r m a -> ReaderT r m [a] #

Class (Monad f, Alternative f) (MonadPlus f) 
Instance details

Defined in Data.Constraint

Methods

cls :: MonadPlus f :- (Monad f, Alternative f) #

(Alternative f, Alternative g) => Alternative (f :*: g)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

empty :: (f :*: g) a #

(<|>) :: (f :*: g) a -> (f :*: g) a -> (f :*: g) a #

some :: (f :*: g) a -> (f :*: g) [a] #

many :: (f :*: g) a -> (f :*: g) [a] #

(Alternative f, Alternative g) => Alternative (Product f g)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Product

Methods

empty :: Product f g a #

(<|>) :: Product f g a -> Product f g a -> Product f g a #

some :: Product f g a -> Product f g [a] #

many :: Product f g a -> Product f g [a] #

Alternative f => Alternative (M1 i c f)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

empty :: M1 i c f a #

(<|>) :: M1 i c f a -> M1 i c f a -> M1 i c f a #

some :: M1 i c f a -> M1 i c f [a] #

many :: M1 i c f a -> M1 i c f [a] #

(Alternative f, Applicative g) => Alternative (f :.: g)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

empty :: (f :.: g) a #

(<|>) :: (f :.: g) a -> (f :.: g) a -> (f :.: g) a #

some :: (f :.: g) a -> (f :.: g) [a] #

many :: (f :.: g) a -> (f :.: g) [a] #

(Alternative f, Applicative g) => Alternative (Compose f g)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Compose

Methods

empty :: Compose f g a #

(<|>) :: Compose f g a -> Compose f g a -> Compose f g a #

some :: Compose f g a -> Compose f g [a] #

many :: Compose f g a -> Compose f g [a] #

class (Alternative m, Monad m) => MonadPlus (m :: Type -> Type) where #

Monads that also support choice and failure.

Minimal complete definition

Nothing

Methods

mzero :: m a #

The identity of mplus. It should also satisfy the equations

mzero >>= f  =  mzero
v >> mzero   =  mzero

The default definition is

mzero = empty

mplus :: m a -> m a -> m a #

An associative operation. The default definition is

mplus = (<|>)

Instances

Instances details
MonadPlus []

Since: base-2.1

Instance details

Defined in GHC.Base

Methods

mzero :: [a] #

mplus :: [a] -> [a] -> [a] #

MonadPlus Maybe

Since: base-2.1

Instance details

Defined in GHC.Base

Methods

mzero :: Maybe a #

mplus :: Maybe a -> Maybe a -> Maybe a #

MonadPlus IO

Since: base-4.9.0.0

Instance details

Defined in GHC.Base

Methods

mzero :: IO a #

mplus :: IO a -> IO a -> IO a #

MonadPlus IResult 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

mzero :: IResult a #

mplus :: IResult a -> IResult a -> IResult a #

MonadPlus Result 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

mzero :: Result a #

mplus :: Result a -> Result a -> Result a #

MonadPlus Parser 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

mzero :: Parser a #

mplus :: Parser a -> Parser a -> Parser a #

MonadPlus Option

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

mzero :: Option a #

mplus :: Option a -> Option a -> Option a #

MonadPlus STM

Since: base-4.3.0.0

Instance details

Defined in GHC.Conc.Sync

Methods

mzero :: STM a #

mplus :: STM a -> STM a -> STM a #

MonadPlus ReadP

Since: base-2.1

Instance details

Defined in Text.ParserCombinators.ReadP

Methods

mzero :: ReadP a #

mplus :: ReadP a -> ReadP a -> ReadP a #

MonadPlus Seq 
Instance details

Defined in Data.Sequence.Internal

Methods

mzero :: Seq a #

mplus :: Seq a -> Seq a -> Seq a #

MonadPlus DList 
Instance details

Defined in Data.DList

Methods

mzero :: DList a #

mplus :: DList a -> DList a -> DList a #

MonadPlus Vector 
Instance details

Defined in Data.Vector

Methods

mzero :: Vector a #

mplus :: Vector a -> Vector a -> Vector a #

MonadPlus SmallArray 
Instance details

Defined in Data.Primitive.SmallArray

MonadPlus Array 
Instance details

Defined in Data.Primitive.Array

Methods

mzero :: Array a #

mplus :: Array a -> Array a -> Array a #

MonadPlus P

Since: base-2.1

Instance details

Defined in Text.ParserCombinators.ReadP

Methods

mzero :: P a #

mplus :: P a -> P a -> P a #

() :=> (MonadPlus []) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- MonadPlus [] #

() :=> (MonadPlus Maybe) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- MonadPlus Maybe #

MonadPlus (U1 :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

mzero :: U1 a #

mplus :: U1 a -> U1 a -> U1 a #

MonadPlus (Parser i) 
Instance details

Defined in Data.Attoparsec.Internal.Types

Methods

mzero :: Parser i a #

mplus :: Parser i a -> Parser i a -> Parser i a #

(ArrowApply a, ArrowPlus a) => MonadPlus (ArrowMonad a)

Since: base-4.6.0.0

Instance details

Defined in Control.Arrow

Methods

mzero :: ArrowMonad a a0 #

mplus :: ArrowMonad a a0 -> ArrowMonad a a0 -> ArrowMonad a a0 #

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 #

Monad m => MonadPlus (MaybeT m) 
Instance details

Defined in Control.Monad.Trans.Maybe

Methods

mzero :: MaybeT m a #

mplus :: MaybeT m a -> MaybeT m a -> MaybeT m a #

(Functor v, MonadPlus v) => MonadPlus (Free v)

This violates the MonadPlus laws, handle with care.

Instance details

Defined in Control.Monad.Free

Methods

mzero :: Free v a #

mplus :: Free v a -> Free v a -> Free v a #

MonadPlus m => MonadPlus (Yoneda m) 
Instance details

Defined in Data.Functor.Yoneda

Methods

mzero :: Yoneda m a #

mplus :: Yoneda m a -> Yoneda m a -> Yoneda m a #

MonadPlus (ReifiedFold s) 
Instance details

Defined in Control.Lens.Reified

Methods

mzero :: ReifiedFold s a #

mplus :: ReifiedFold s a -> ReifiedFold s a -> ReifiedFold s a #

(MonadPlus m) :=> (Alternative (WrappedMonad m)) 
Instance details

Defined in Data.Constraint

MonadPlus f => MonadPlus (Rec1 f)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

mzero :: Rec1 f a #

mplus :: Rec1 f a -> Rec1 f a -> Rec1 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 #

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 #

MonadPlus m => MonadPlus (IdentityT m) 
Instance details

Defined in Control.Monad.Trans.Identity

Methods

mzero :: IdentityT m a #

mplus :: IdentityT m a -> IdentityT m a -> IdentityT m a #

(Monad m, Monoid e) => MonadPlus (ExceptT e m) 
Instance details

Defined in Control.Monad.Trans.Except

Methods

mzero :: ExceptT e m a #

mplus :: ExceptT e m a -> ExceptT e m a -> ExceptT e m a #

(Functor f, MonadPlus m) => MonadPlus (FreeT f m) 
Instance details

Defined in Control.Monad.Trans.Free

Methods

mzero :: FreeT f m a #

mplus :: FreeT f m a -> FreeT f m a -> FreeT f m a #

(Monad m, Error e) => MonadPlus (ErrorT e m) 
Instance details

Defined in Control.Monad.Trans.Error

Methods

mzero :: ErrorT e m a #

mplus :: ErrorT e m a -> ErrorT e m a -> ErrorT e m a #

MonadPlus m => MonadPlus (StateT s m) 
Instance details

Defined in Control.Monad.Trans.State.Strict

Methods

mzero :: StateT s m a #

mplus :: StateT s m a -> StateT s m a -> StateT s m a #

MonadPlus m => MonadPlus (ReaderT r m) 
Instance details

Defined in Control.Monad.Trans.Reader

Methods

mzero :: ReaderT r m a #

mplus :: ReaderT r m a -> ReaderT r m a -> ReaderT r m a #

Class (Monad f, Alternative f) (MonadPlus f) 
Instance details

Defined in Data.Constraint

Methods

cls :: MonadPlus f :- (Monad f, Alternative f) #

(MonadPlus f, MonadPlus g) => MonadPlus (f :*: g)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

mzero :: (f :*: g) a #

mplus :: (f :*: g) a -> (f :*: g) a -> (f :*: g) a #

(MonadPlus f, MonadPlus g) => MonadPlus (Product f g)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Product

Methods

mzero :: Product f g a #

mplus :: Product f g a -> Product f g a -> Product f g a #

MonadPlus f => MonadPlus (M1 i c f)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Methods

mzero :: M1 i c f a #

mplus :: M1 i c f a -> M1 i c f a -> M1 i c f a #

newtype Compose (f :: k -> Type) (g :: k1 -> k) (a :: k1) infixr 9 #

Right-to-left composition of functors. The composition of applicative functors is always applicative, but the composition of monads is not always a monad.

Constructors

Compose infixr 9 

Fields

Instances

Instances details
Functor f => Generic1 (Compose f g :: k -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Compose

Associated Types

type Rep1 (Compose f g) :: k -> Type #

Methods

from1 :: forall (a :: k0). Compose f g a -> Rep1 (Compose f g) a #

to1 :: forall (a :: k0). Rep1 (Compose f g) a -> Compose f g a #

Unbox (f (g a)) => Vector Vector (Compose f g a) 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicUnsafeFreeze :: PrimMonad m => Mutable Vector (PrimState m) (Compose f g a) -> m (Vector (Compose f g a)) #

basicUnsafeThaw :: PrimMonad m => Vector (Compose f g a) -> m (Mutable Vector (PrimState m) (Compose f g a)) #

basicLength :: Vector (Compose f g a) -> Int #

basicUnsafeSlice :: Int -> Int -> Vector (Compose f g a) -> Vector (Compose f g a) #

basicUnsafeIndexM :: Monad m => Vector (Compose f g a) -> Int -> m (Compose f g a) #

basicUnsafeCopy :: PrimMonad m => Mutable Vector (PrimState m) (Compose f g a) -> Vector (Compose f g a) -> m () #

elemseq :: Vector (Compose f g a) -> Compose f g a -> b -> b #

Unbox (f (g a)) => MVector MVector (Compose f g a) 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicLength :: MVector s (Compose f g a) -> Int #

basicUnsafeSlice :: Int -> Int -> MVector s (Compose f g a) -> MVector s (Compose f g a) #

basicOverlaps :: MVector s (Compose f g a) -> MVector s (Compose f g a) -> Bool #

basicUnsafeNew :: PrimMonad m => Int -> m (MVector (PrimState m) (Compose f g a)) #

basicInitialize :: PrimMonad m => MVector (PrimState m) (Compose f g a) -> m () #

basicUnsafeReplicate :: PrimMonad m => Int -> Compose f g a -> m (MVector (PrimState m) (Compose f g a)) #

basicUnsafeRead :: PrimMonad m => MVector (PrimState m) (Compose f g a) -> Int -> m (Compose f g a) #

basicUnsafeWrite :: PrimMonad m => MVector (PrimState m) (Compose f g a) -> Int -> Compose f g a -> m () #

basicClear :: PrimMonad m => MVector (PrimState m) (Compose f g a) -> m () #

basicSet :: PrimMonad m => MVector (PrimState m) (Compose f g a) -> Compose f g a -> m () #

basicUnsafeCopy :: PrimMonad m => MVector (PrimState m) (Compose f g a) -> MVector (PrimState m) (Compose f g a) -> m () #

basicUnsafeMove :: PrimMonad m => MVector (PrimState m) (Compose f g a) -> MVector (PrimState m) (Compose f g a) -> m () #

basicUnsafeGrow :: PrimMonad m => MVector (PrimState m) (Compose f g a) -> Int -> m (MVector (PrimState m) (Compose f g a)) #

Sieve (ReifiedIndexedFold i) (Compose [] ((,) i)) 
Instance details

Defined in Control.Lens.Reified

Methods

sieve :: ReifiedIndexedFold i a b -> a -> Compose [] ((,) i) b #

(Sieve p f, Sieve q g) => Sieve (Procompose p q) (Compose g f) 
Instance details

Defined in Data.Profunctor.Composition

Methods

sieve :: Procompose p q a b -> a -> Compose g f b #

(Cosieve p f, Cosieve q g) => Cosieve (Procompose p q) (Compose f g) 
Instance details

Defined in Data.Profunctor.Composition

Methods

cosieve :: Procompose p q a b -> Compose f g a -> b #

(Functor f, Functor g) => Functor (Compose f g)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Compose

Methods

fmap :: (a -> b) -> Compose f g a -> Compose f g b #

(<$) :: a -> Compose f g b -> Compose f g a #

(Applicative f, Applicative g) => Applicative (Compose f g)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Compose

Methods

pure :: a -> Compose f g a #

(<*>) :: Compose f g (a -> b) -> Compose f g a -> Compose f g b #

liftA2 :: (a -> b -> c) -> Compose f g a -> Compose f g b -> Compose f g c #

(*>) :: Compose f g a -> Compose f g b -> Compose f g b #

(<*) :: Compose f g a -> Compose f g b -> Compose f g a #

(Foldable f, Foldable g) => Foldable (Compose f g)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Compose

Methods

fold :: Monoid m => Compose f g m -> m #

foldMap :: Monoid m => (a -> m) -> Compose f g a -> m #

foldMap' :: Monoid m => (a -> m) -> Compose f g a -> m #

foldr :: (a -> b -> b) -> b -> Compose f g a -> b #

foldr' :: (a -> b -> b) -> b -> Compose f g a -> b #

foldl :: (b -> a -> b) -> b -> Compose f g a -> b #

foldl' :: (b -> a -> b) -> b -> Compose f g a -> b #

foldr1 :: (a -> a -> a) -> Compose f g a -> a #

foldl1 :: (a -> a -> a) -> Compose f g a -> a #

toList :: Compose f g a -> [a] #

null :: Compose f g a -> Bool #

length :: Compose f g a -> Int #

elem :: Eq a => a -> Compose f g a -> Bool #

maximum :: Ord a => Compose f g a -> a #

minimum :: Ord a => Compose f g a -> a #

sum :: Num a => Compose f g a -> a #

product :: Num a => Compose f g a -> a #

(Traversable f, Traversable g) => Traversable (Compose f g)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Compose

Methods

traverse :: Applicative f0 => (a -> f0 b) -> Compose f g a -> f0 (Compose f g b) #

sequenceA :: Applicative f0 => Compose f g (f0 a) -> f0 (Compose f g a) #

mapM :: Monad m => (a -> m b) -> Compose f g a -> m (Compose f g b) #

sequence :: Monad m => Compose f g (m a) -> m (Compose f g a) #

(Representable f, Representable g) => Representable (Compose f g) 
Instance details

Defined in Data.Functor.Rep

Associated Types

type Rep (Compose f g) #

Methods

tabulate :: (Rep (Compose f g) -> a) -> Compose f g a #

index :: Compose f g a -> Rep (Compose f g) -> a #

(Alternative f, Applicative g) => Alternative (Compose f g)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Compose

Methods

empty :: Compose f g a #

(<|>) :: Compose f g a -> Compose f g a -> Compose f g a #

some :: Compose f g a -> Compose f g [a] #

many :: Compose f g a -> Compose f g [a] #

(Eq1 f, Eq1 g) => Eq1 (Compose f g)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Compose

Methods

liftEq :: (a -> b -> Bool) -> Compose f g a -> Compose f g b -> Bool #

(Ord1 f, Ord1 g) => Ord1 (Compose f g)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Compose

Methods

liftCompare :: (a -> b -> Ordering) -> Compose f g a -> Compose f g b -> Ordering #

(Read1 f, Read1 g) => Read1 (Compose f g)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Compose

Methods

liftReadsPrec :: (Int -> ReadS a) -> ReadS [a] -> Int -> ReadS (Compose f g a) #

liftReadList :: (Int -> ReadS a) -> ReadS [a] -> ReadS [Compose f g a] #

liftReadPrec :: ReadPrec a -> ReadPrec [a] -> ReadPrec (Compose f g a) #

liftReadListPrec :: ReadPrec a -> ReadPrec [a] -> ReadPrec [Compose f g a] #

(Show1 f, Show1 g) => Show1 (Compose f g)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Compose

Methods

liftShowsPrec :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> Int -> Compose f g a -> ShowS #

liftShowList :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> [Compose f g a] -> ShowS #

(NFData1 f, NFData1 g) => NFData1 (Compose f g)

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

liftRnf :: (a -> ()) -> Compose f g a -> () #

(Hashable1 f, Hashable1 g) => Hashable1 (Compose f g) 
Instance details

Defined in Data.Hashable.Class

Methods

liftHashWithSalt :: (Int -> a -> Int) -> Int -> Compose f g a -> Int #

(Eq1 f, Eq1 g, Eq a) => Eq (Compose f g a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Compose

Methods

(==) :: Compose f g a -> Compose f g a -> Bool #

(/=) :: Compose f g a -> Compose f g a -> Bool #

(Typeable a, Typeable f, Typeable g, Typeable k1, Typeable k2, Data (f (g a))) => Data (Compose f g a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Compose

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g0. g0 -> c g0) -> Compose f g a -> c (Compose f g a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Compose f g a) #

toConstr :: Compose f g a -> Constr #

dataTypeOf :: Compose f g a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Compose f g a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Compose f g a)) #

gmapT :: (forall b. Data b => b -> b) -> Compose f g a -> Compose f g a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Compose f g a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Compose f g a -> r #

gmapQ :: (forall d. Data d => d -> u) -> Compose f g a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Compose f g a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Compose f g a -> m (Compose f g a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Compose f g a -> m (Compose f g a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Compose f g a -> m (Compose f g a) #

(Ord1 f, Ord1 g, Ord a) => Ord (Compose f g a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Compose

Methods

compare :: Compose f g a -> Compose f g a -> Ordering #

(<) :: Compose f g a -> Compose f g a -> Bool #

(<=) :: Compose f g a -> Compose f g a -> Bool #

(>) :: Compose f g a -> Compose f g a -> Bool #

(>=) :: Compose f g a -> Compose f g a -> Bool #

max :: Compose f g a -> Compose f g a -> Compose f g a #

min :: Compose f g a -> Compose f g a -> Compose f g a #

(Read1 f, Read1 g, Read a) => Read (Compose f g a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Compose

Methods

readsPrec :: Int -> ReadS (Compose f g a) #

readList :: ReadS [Compose f g a] #

readPrec :: ReadPrec (Compose f g a) #

readListPrec :: ReadPrec [Compose f g a] #

(Show1 f, Show1 g, Show a) => Show (Compose f g a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Compose

Methods

showsPrec :: Int -> Compose f g a -> ShowS #

show :: Compose f g a -> String #

showList :: [Compose f g a] -> ShowS #

Generic (Compose f g a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Compose

Associated Types

type Rep (Compose f g a) :: Type -> Type #

Methods

from :: Compose f g a -> Rep (Compose f g a) x #

to :: Rep (Compose f g a) x -> Compose f g a #

(Hashable1 f, Hashable1 g, Hashable a) => Hashable (Compose f g a)

In general, hash (Compose x) ≠ hash x. However, hashWithSalt satisfies its variant of this equivalence.

Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Compose f g a -> Int #

hash :: Compose f g a -> Int #

(NFData1 f, NFData1 g, NFData a) => NFData (Compose f g a)

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Compose f g a -> () #

Unbox (f (g a)) => Unbox (Compose f g a) 
Instance details

Defined in Data.Vector.Unboxed.Base

Wrapped (Compose f g a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (Compose f g a) #

Methods

_Wrapped' :: Iso' (Compose f g a) (Unwrapped (Compose f g a)) #

t ~ Compose f' g' a' => Rewrapped (Compose f g a) t 
Instance details

Defined in Control.Lens.Wrapped

type Rep1 (Compose f g :: k -> Type) 
Instance details

Defined in Data.Functor.Compose

type Rep1 (Compose f g :: k -> Type) = D1 ('MetaData "Compose" "Data.Functor.Compose" "base" 'True) (C1 ('MetaCons "Compose" 'PrefixI 'True) (S1 ('MetaSel ('Just "getCompose") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (f :.: Rec1 g)))
newtype MVector s (Compose f g a) 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype MVector s (Compose f g a) = MV_Compose (MVector s (f (g a)))
type Rep (Compose f g) 
Instance details

Defined in Data.Functor.Rep

type Rep (Compose f g) = (Rep f, Rep g)
type Rep (Compose f g a) 
Instance details

Defined in Data.Functor.Compose

type Rep (Compose f g a) = D1 ('MetaData "Compose" "Data.Functor.Compose" "base" 'True) (C1 ('MetaCons "Compose" 'PrefixI 'True) (S1 ('MetaSel ('Just "getCompose") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (f (g a)))))
newtype Vector (Compose f g a) 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype Vector (Compose f g a) = V_Compose (Vector (f (g a)))
type Unwrapped (Compose f g a) 
Instance details

Defined in Control.Lens.Wrapped

type Unwrapped (Compose f g a) = f (g a)

vacuous :: Functor f => f Void -> f a #

If Void is uninhabited then any Functor that holds only values of type Void is holding no values.

Since: base-4.8.0.0

absurd :: Void -> a #

Since Void values logically don't exist, this witnesses the logical reasoning tool of "ex falso quodlibet".

>>> let x :: Either Void Int; x = Right 5
>>> :{
case x of
    Right r -> r
    Left l  -> absurd l
:}
5

Since: base-4.8.0.0

data Void #

Uninhabited data type

Since: base-4.8.0.0

Instances

Instances details
Eq Void

Since: base-4.8.0.0

Instance details

Defined in Data.Void

Methods

(==) :: Void -> Void -> Bool #

(/=) :: Void -> Void -> Bool #

Data Void

Since: base-4.8.0.0

Instance details

Defined in Data.Void

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Void -> c Void #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Void #

toConstr :: Void -> Constr #

dataTypeOf :: Void -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Void) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Void) #

gmapT :: (forall b. Data b => b -> b) -> Void -> Void #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Void -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Void -> r #

gmapQ :: (forall d. Data d => d -> u) -> Void -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Void -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Void -> m Void #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Void -> m Void #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Void -> m Void #

Ord Void

Since: base-4.8.0.0

Instance details

Defined in Data.Void

Methods

compare :: Void -> Void -> Ordering #

(<) :: Void -> Void -> Bool #

(<=) :: Void -> Void -> Bool #

(>) :: Void -> Void -> Bool #

(>=) :: Void -> Void -> Bool #

max :: Void -> Void -> Void #

min :: Void -> Void -> Void #

Read Void

Reading a Void value is always a parse error, considering Void as a data type with no constructors.

Since: base-4.8.0.0

Instance details

Defined in Data.Void

Show Void

Since: base-4.8.0.0

Instance details

Defined in Data.Void

Methods

showsPrec :: Int -> Void -> ShowS #

show :: Void -> String #

showList :: [Void] -> ShowS #

Ix Void

Since: base-4.8.0.0

Instance details

Defined in Data.Void

Methods

range :: (Void, Void) -> [Void] #

index :: (Void, Void) -> Void -> Int #

unsafeIndex :: (Void, Void) -> Void -> Int #

inRange :: (Void, Void) -> Void -> Bool #

rangeSize :: (Void, Void) -> Int #

unsafeRangeSize :: (Void, Void) -> Int #

Generic Void

Since: base-4.8.0.0

Instance details

Defined in Data.Void

Associated Types

type Rep Void :: Type -> Type #

Methods

from :: Void -> Rep Void x #

to :: Rep Void x -> Void #

Semigroup Void

Since: base-4.9.0.0

Instance details

Defined in Data.Void

Methods

(<>) :: Void -> Void -> Void #

sconcat :: NonEmpty Void -> Void #

stimes :: Integral b => b -> Void -> Void #

Lift Void

Since: template-haskell-2.15.0.0

Instance details

Defined in Language.Haskell.TH.Syntax

Methods

lift :: Void -> Q Exp #

Hashable Void 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Void -> Int #

hash :: Void -> Int #

Exception Void

Since: base-4.8.0.0

Instance details

Defined in Data.Void

NFData Void

Defined as rnf = absurd.

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Void -> () #

ShowErrorComponent Void 
Instance details

Defined in Text.Megaparsec.Error

PShow Void 
Instance details

Defined in Data.Singletons.Prelude.Show

Associated Types

type ShowsPrec arg0 arg1 arg2 :: Symbol #

type Show_ arg0 :: Symbol #

type ShowList arg0 arg1 :: Symbol #

SShow Void 
Instance details

Defined in Data.Singletons.Prelude.Show

Methods

sShowsPrec :: forall (t1 :: Nat) (t2 :: Void) (t3 :: Symbol). Sing t1 -> Sing t2 -> Sing t3 -> Sing (Apply (Apply (Apply ShowsPrecSym0 t1) t2) t3) #

sShow_ :: forall (t :: Void). Sing t -> Sing (Apply Show_Sym0 t) #

sShowList :: forall (t1 :: [Void]) (t2 :: Symbol). Sing t1 -> Sing t2 -> Sing (Apply (Apply ShowListSym0 t1) t2) #

PSemigroup Void 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

Associated Types

type arg0 <> arg1 :: a0 #

type Sconcat arg0 :: a0 #

SSemigroup Void 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

Methods

(%<>) :: forall (t1 :: Void) (t2 :: Void). Sing t1 -> Sing t2 -> Sing (Apply (Apply (<>@#@$) t1) t2) #

sSconcat :: forall (t :: NonEmpty Void). Sing t -> Sing (Apply SconcatSym0 t) #

POrd Void 
Instance details

Defined in Data.Singletons.Prelude.Ord

Associated Types

type Compare arg0 arg1 :: Ordering #

type arg0 < arg1 :: Bool #

type arg0 <= arg1 :: Bool #

type arg0 > arg1 :: Bool #

type arg0 >= arg1 :: Bool #

type Max arg0 arg1 :: a0 #

type Min arg0 arg1 :: a0 #

SOrd Void 
Instance details

Defined in Data.Singletons.Prelude.Ord

Methods

sCompare :: forall (t1 :: Void) (t2 :: Void). Sing t1 -> Sing t2 -> Sing (Apply (Apply CompareSym0 t1) t2) #

(%<) :: forall (t1 :: Void) (t2 :: Void). Sing t1 -> Sing t2 -> Sing (Apply (Apply (<@#@$) t1) t2) #

(%<=) :: forall (t1 :: Void) (t2 :: Void). Sing t1 -> Sing t2 -> Sing (Apply (Apply (<=@#@$) t1) t2) #

(%>) :: forall (t1 :: Void) (t2 :: Void). Sing t1 -> Sing t2 -> Sing (Apply (Apply (>@#@$) t1) t2) #

(%>=) :: forall (t1 :: Void) (t2 :: Void). Sing t1 -> Sing t2 -> Sing (Apply (Apply (>=@#@$) t1) t2) #

sMax :: forall (t1 :: Void) (t2 :: Void). Sing t1 -> Sing t2 -> Sing (Apply (Apply MaxSym0 t1) t2) #

sMin :: forall (t1 :: Void) (t2 :: Void). Sing t1 -> Sing t2 -> Sing (Apply (Apply MinSym0 t1) t2) #

SEq Void 
Instance details

Defined in Data.Singletons.Prelude.Eq

Methods

(%==) :: forall (a :: Void) (b :: Void). Sing a -> Sing b -> Sing (a == b) #

(%/=) :: forall (a :: Void) (b :: Void). Sing a -> Sing b -> Sing (a /= b) #

PEq Void 
Instance details

Defined in Data.Singletons.Prelude.Eq

Associated Types

type x == y :: Bool #

type x /= y :: Bool #

TestCoercion SVoid 
Instance details

Defined in Data.Singletons.Prelude.Instances

Methods

testCoercion :: forall (a :: k) (b :: k). SVoid a -> SVoid b -> Maybe (Coercion a b) #

TestEquality SVoid 
Instance details

Defined in Data.Singletons.Prelude.Instances

Methods

testEquality :: forall (a :: k) (b :: k). SVoid a -> SVoid b -> Maybe (a :~: b) #

SuppressUnusedWarnings ShowsPrec_6989586621680595913Sym0 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings Compare_6989586621679803332Sym0 
Instance details

Defined in Data.Singletons.Prelude.Ord

SuppressUnusedWarnings (Compare_6989586621679803332Sym1 a6989586621679803330 :: TyFun Void Ordering -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

SuppressUnusedWarnings (ShowsPrec_6989586621680595913Sym1 a6989586621680595910 :: TyFun Void (Symbol ~> Symbol) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Rep Void 
Instance details

Defined in Data.Void

type Rep Void = D1 ('MetaData "Void" "Data.Void" "base" 'False) (V1 :: Type -> Type)
type Sing 
Instance details

Defined in Data.Singletons.Prelude.Instances

type Sing = SVoid
type Demote Void 
Instance details

Defined in Data.Singletons.Prelude.Instances

type Show_ (arg0 :: Void) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Show_ (arg0 :: Void) = Apply (Show__6989586621680577846Sym0 :: TyFun Void Symbol -> Type) arg0
type Sconcat (arg0 :: NonEmpty Void) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Sconcat (arg0 :: NonEmpty Void) = Apply (Sconcat_6989586621680187691Sym0 :: TyFun (NonEmpty Void) Void -> Type) arg0
type ShowList (arg1 :: [Void]) arg2 
Instance details

Defined in Data.Singletons.Prelude.Show

type ShowList (arg1 :: [Void]) arg2 = Apply (Apply (ShowList_6989586621680577854Sym0 :: TyFun [Void] (Symbol ~> Symbol) -> Type) arg1) arg2
type (a1 :: Void) <> (a2 :: Void) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type (a1 :: Void) <> (a2 :: Void) = Apply (Apply (TFHelper_6989586621680187950Sym0 :: TyFun Void (Void ~> Void) -> Type) a1) a2
type Min (arg1 :: Void) (arg2 :: Void) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Min (arg1 :: Void) (arg2 :: Void) = Apply (Apply (Min_6989586621679792614Sym0 :: TyFun Void (Void ~> Void) -> Type) arg1) arg2
type Max (arg1 :: Void) (arg2 :: Void) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Max (arg1 :: Void) (arg2 :: Void) = Apply (Apply (Max_6989586621679792596Sym0 :: TyFun Void (Void ~> Void) -> Type) arg1) arg2
type (arg1 :: Void) >= (arg2 :: Void) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type (arg1 :: Void) >= (arg2 :: Void) = Apply (Apply (TFHelper_6989586621679792578Sym0 :: TyFun Void (Void ~> Bool) -> Type) arg1) arg2
type (arg1 :: Void) > (arg2 :: Void) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type (arg1 :: Void) > (arg2 :: Void) = Apply (Apply (TFHelper_6989586621679792560Sym0 :: TyFun Void (Void ~> Bool) -> Type) arg1) arg2
type (arg1 :: Void) <= (arg2 :: Void) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type (arg1 :: Void) <= (arg2 :: Void) = Apply (Apply (TFHelper_6989586621679792542Sym0 :: TyFun Void (Void ~> Bool) -> Type) arg1) arg2
type (arg1 :: Void) < (arg2 :: Void) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type (arg1 :: Void) < (arg2 :: Void) = Apply (Apply (TFHelper_6989586621679792524Sym0 :: TyFun Void (Void ~> Bool) -> Type) arg1) arg2
type Compare (a1 :: Void) (a2 :: Void) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Compare (a1 :: Void) (a2 :: Void) = Apply (Apply Compare_6989586621679803332Sym0 a1) a2
type (x :: Void) /= (y :: Void) 
Instance details

Defined in Data.Singletons.Prelude.Eq

type (x :: Void) /= (y :: Void) = Not (x == y)
type (a :: Void) == (b :: Void) 
Instance details

Defined in Data.Singletons.Prelude.Eq

type (a :: Void) == (b :: Void) = Equals_6989586621679776162 a b
type ShowsPrec a1 (a2 :: Void) a3 
Instance details

Defined in Data.Singletons.Prelude.Show

type ShowsPrec a1 (a2 :: Void) a3 = Apply (Apply (Apply ShowsPrec_6989586621680595913Sym0 a1) a2) a3
type Apply (Compare_6989586621679803332Sym1 a6989586621679803330 :: TyFun Void Ordering -> Type) (a6989586621679803331 :: Void) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Apply (Compare_6989586621679803332Sym1 a6989586621679803330 :: TyFun Void Ordering -> Type) (a6989586621679803331 :: Void) = Compare_6989586621679803332 a6989586621679803330 a6989586621679803331
type Apply ShowsPrec_6989586621680595913Sym0 (a6989586621680595910 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply ShowsPrec_6989586621680595913Sym0 (a6989586621680595910 :: Nat) = ShowsPrec_6989586621680595913Sym1 a6989586621680595910
type Apply Compare_6989586621679803332Sym0 (a6989586621679803330 :: Void) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Apply Compare_6989586621679803332Sym0 (a6989586621679803330 :: Void) = Compare_6989586621679803332Sym1 a6989586621679803330
type Apply (ShowsPrec_6989586621680595913Sym1 a6989586621680595910 :: TyFun Void (Symbol ~> Symbol) -> Type) (a6989586621680595911 :: Void) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680595913Sym1 a6989586621680595910 :: TyFun Void (Symbol ~> Symbol) -> Type) (a6989586621680595911 :: Void) = ShowsPrec_6989586621680595913Sym2 a6989586621680595910 a6989586621680595911

mtimesDefault :: (Integral b, Monoid a) => b -> a -> a #

Repeat a value n times.

mtimesDefault n a = a <> a <> ... <> a  -- using <> (n-1) times

Implemented using stimes and mempty.

This is a suitable definition for an mtimes member of Monoid.

cycle1 :: Semigroup m => m -> m #

A generalization of cycle to an arbitrary Semigroup. May fail to terminate for some values in some semigroups.

data WrappedMonoid m #

Provide a Semigroup for an arbitrary Monoid.

NOTE: This is not needed anymore since Semigroup became a superclass of Monoid in base-4.11 and this newtype be deprecated at some point in the future.

Instances

Instances details
NFData1 WrappedMonoid

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

liftRnf :: (a -> ()) -> WrappedMonoid a -> () #

Unbox a => Vector Vector (WrappedMonoid a) 
Instance details

Defined in Data.Vector.Unboxed.Base

Unbox a => MVector MVector (WrappedMonoid a) 
Instance details

Defined in Data.Vector.Unboxed.Base

Bounded m => Bounded (WrappedMonoid m)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Enum a => Enum (WrappedMonoid a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Eq m => Eq (WrappedMonoid m)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Data m => Data (WrappedMonoid m)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> WrappedMonoid m -> c (WrappedMonoid m) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (WrappedMonoid m) #

toConstr :: WrappedMonoid m -> Constr #

dataTypeOf :: WrappedMonoid m -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (WrappedMonoid m)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (WrappedMonoid m)) #

gmapT :: (forall b. Data b => b -> b) -> WrappedMonoid m -> WrappedMonoid m #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> WrappedMonoid m -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> WrappedMonoid m -> r #

gmapQ :: (forall d. Data d => d -> u) -> WrappedMonoid m -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> WrappedMonoid m -> u #

gmapM :: Monad m0 => (forall d. Data d => d -> m0 d) -> WrappedMonoid m -> m0 (WrappedMonoid m) #

gmapMp :: MonadPlus m0 => (forall d. Data d => d -> m0 d) -> WrappedMonoid m -> m0 (WrappedMonoid m) #

gmapMo :: MonadPlus m0 => (forall d. Data d => d -> m0 d) -> WrappedMonoid m -> m0 (WrappedMonoid m) #

Ord m => Ord (WrappedMonoid m)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Read m => Read (WrappedMonoid m)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Show m => Show (WrappedMonoid m)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Generic (WrappedMonoid m)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Associated Types

type Rep (WrappedMonoid m) :: Type -> Type #

Monoid m => Semigroup (WrappedMonoid m)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Monoid m => Monoid (WrappedMonoid m)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Hashable a => Hashable (WrappedMonoid a) 
Instance details

Defined in Data.Hashable.Class

NFData m => NFData (WrappedMonoid m)

Since: deepseq-1.4.2.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: WrappedMonoid m -> () #

Unbox a => Unbox (WrappedMonoid a) 
Instance details

Defined in Data.Vector.Unboxed.Base

Wrapped (WrappedMonoid a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (WrappedMonoid a) #

Generic1 WrappedMonoid

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Associated Types

type Rep1 WrappedMonoid :: k -> Type #

Methods

from1 :: forall (a :: k). WrappedMonoid a -> Rep1 WrappedMonoid a #

to1 :: forall (a :: k). Rep1 WrappedMonoid a -> WrappedMonoid a #

t ~ WrappedMonoid b => Rewrapped (WrappedMonoid a) t 
Instance details

Defined in Control.Lens.Wrapped

SDecide m => TestCoercion (SWrappedMonoid :: WrappedMonoid m -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

Methods

testCoercion :: forall (a :: k) (b :: k). SWrappedMonoid a -> SWrappedMonoid b -> Maybe (Coercion a b) #

SDecide m => TestEquality (SWrappedMonoid :: WrappedMonoid m -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

Methods

testEquality :: forall (a :: k) (b :: k). SWrappedMonoid a -> SWrappedMonoid b -> Maybe (a :~: b) #

SingI (WrapMonoidSym0 :: TyFun m (WrappedMonoid m) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (ToEnum_6989586621681108989Sym0 :: TyFun Nat (WrappedMonoid a6989586621681107190) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (ShowsPrec_6989586621681091494Sym0 :: TyFun Nat (WrappedMonoid m6989586621679090730 ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (WrapMonoidSym0 :: TyFun m6989586621679090730 (WrappedMonoid m6989586621679090730) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (UnwrapMonoidSym0 :: TyFun (WrappedMonoid m6989586621679090730) m6989586621679090730 -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (Compare_6989586621680206787Sym0 :: TyFun (WrappedMonoid m6989586621679090730) (WrappedMonoid m6989586621679090730 ~> Ordering) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (TFHelper_6989586621681108962Sym0 :: TyFun (WrappedMonoid m6989586621681107186) (WrappedMonoid m6989586621681107186 ~> WrappedMonoid m6989586621681107186) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (Succ_6989586621681108975Sym0 :: TyFun (WrappedMonoid a6989586621681107190) (WrappedMonoid a6989586621681107190) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (Pred_6989586621681108982Sym0 :: TyFun (WrappedMonoid a6989586621681107190) (WrappedMonoid a6989586621681107190) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (FromEnum_6989586621681108998Sym0 :: TyFun (WrappedMonoid a6989586621681107190) Nat -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (EnumFromTo_6989586621681109006Sym0 :: TyFun (WrappedMonoid a6989586621681107190) (WrappedMonoid a6989586621681107190 ~> [WrappedMonoid a6989586621681107190]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (EnumFromThenTo_6989586621681109019Sym0 :: TyFun (WrappedMonoid a6989586621681107190) (WrappedMonoid a6989586621681107190 ~> (WrappedMonoid a6989586621681107190 ~> [WrappedMonoid a6989586621681107190])) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (Compare_6989586621680206787Sym1 a6989586621680206785 :: TyFun (WrappedMonoid m6989586621679090730) Ordering -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (TFHelper_6989586621681108962Sym1 a6989586621681108960 :: TyFun (WrappedMonoid m6989586621681107186) (WrappedMonoid m6989586621681107186) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (ShowsPrec_6989586621681091494Sym1 a6989586621681091491 m6989586621679090730 :: TyFun (WrappedMonoid m6989586621679090730) (Symbol ~> Symbol) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (EnumFromTo_6989586621681109006Sym1 a6989586621681109004 :: TyFun (WrappedMonoid a6989586621681107190) [WrappedMonoid a6989586621681107190] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (EnumFromThenTo_6989586621681109019Sym1 a6989586621681109016 :: TyFun (WrappedMonoid a6989586621681107190) (WrappedMonoid a6989586621681107190 ~> [WrappedMonoid a6989586621681107190]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (EnumFromThenTo_6989586621681109019Sym2 a6989586621681109017 a6989586621681109016 :: TyFun (WrappedMonoid a6989586621681107190) [WrappedMonoid a6989586621681107190] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

newtype MVector s (WrappedMonoid a) 
Instance details

Defined in Data.Vector.Unboxed.Base

type Apply (ToEnum_6989586621681108989Sym0 :: TyFun Nat (WrappedMonoid a6989586621681107190) -> Type) (a6989586621681108988 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ToEnum_6989586621681108989Sym0 :: TyFun Nat (WrappedMonoid a6989586621681107190) -> Type) (a6989586621681108988 :: Nat) = ToEnum_6989586621681108989 a6989586621681108988 :: WrappedMonoid a6989586621681107190
type Apply (WrapMonoidSym0 :: TyFun m (WrappedMonoid m) -> Type) (t6989586621680197193 :: m) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (WrapMonoidSym0 :: TyFun m (WrappedMonoid m) -> Type) (t6989586621680197193 :: m) = 'WrapMonoid t6989586621680197193
type Apply (ShowsPrec_6989586621681091494Sym0 :: TyFun Nat (WrappedMonoid m6989586621679090730 ~> (Symbol ~> Symbol)) -> Type) (a6989586621681091491 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ShowsPrec_6989586621681091494Sym0 :: TyFun Nat (WrappedMonoid m6989586621679090730 ~> (Symbol ~> Symbol)) -> Type) (a6989586621681091491 :: Nat) = ShowsPrec_6989586621681091494Sym1 a6989586621681091491 m6989586621679090730 :: TyFun (WrappedMonoid m6989586621679090730) (Symbol ~> Symbol) -> Type
type Rep (WrappedMonoid m) 
Instance details

Defined in Data.Semigroup

type Rep (WrappedMonoid m) = D1 ('MetaData "WrappedMonoid" "Data.Semigroup" "base" 'True) (C1 ('MetaCons "WrapMonoid" 'PrefixI 'True) (S1 ('MetaSel ('Just "unwrapMonoid") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 m)))
newtype Vector (WrappedMonoid a) 
Instance details

Defined in Data.Vector.Unboxed.Base

type Unwrapped (WrappedMonoid a) 
Instance details

Defined in Control.Lens.Wrapped

type Sing 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Mempty 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Mempty = Mempty_6989586621681108972Sym0 :: WrappedMonoid m
type MaxBound 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type MaxBound = MaxBound_6989586621680201919Sym0 :: WrappedMonoid m
type MinBound 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type MinBound = MinBound_6989586621680201917Sym0 :: WrappedMonoid m
type Demote (WrappedMonoid m) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Rep1 WrappedMonoid 
Instance details

Defined in Data.Semigroup

type Rep1 WrappedMonoid = D1 ('MetaData "WrappedMonoid" "Data.Semigroup" "base" 'True) (C1 ('MetaCons "WrapMonoid" 'PrefixI 'True) (S1 ('MetaSel ('Just "unwrapMonoid") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1))
type Mconcat (arg0 :: [WrappedMonoid m]) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Mconcat (arg0 :: [WrappedMonoid m]) = Apply (Mconcat_6989586621680631303Sym0 :: TyFun [WrappedMonoid m] (WrappedMonoid m) -> Type) arg0
type Show_ (arg0 :: WrappedMonoid m) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Show_ (arg0 :: WrappedMonoid m) = Apply (Show__6989586621680577846Sym0 :: TyFun (WrappedMonoid m) Symbol -> Type) arg0
type Sconcat (arg0 :: NonEmpty (WrappedMonoid m)) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Sconcat (arg0 :: NonEmpty (WrappedMonoid m)) = Apply (Sconcat_6989586621680187691Sym0 :: TyFun (NonEmpty (WrappedMonoid m)) (WrappedMonoid m) -> Type) arg0
type FromEnum (a2 :: WrappedMonoid a1) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type FromEnum (a2 :: WrappedMonoid a1) = Apply (FromEnum_6989586621681108998Sym0 :: TyFun (WrappedMonoid a1) Nat -> Type) a2
type ToEnum a2 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type ToEnum a2 = Apply (ToEnum_6989586621681108989Sym0 :: TyFun Nat (WrappedMonoid a1) -> Type) a2
type Pred (a2 :: WrappedMonoid a1) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Pred (a2 :: WrappedMonoid a1) = Apply (Pred_6989586621681108982Sym0 :: TyFun (WrappedMonoid a1) (WrappedMonoid a1) -> Type) a2
type Succ (a2 :: WrappedMonoid a1) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Succ (a2 :: WrappedMonoid a1) = Apply (Succ_6989586621681108975Sym0 :: TyFun (WrappedMonoid a1) (WrappedMonoid a1) -> Type) a2
type Mappend (arg1 :: WrappedMonoid m) (arg2 :: WrappedMonoid m) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Mappend (arg1 :: WrappedMonoid m) (arg2 :: WrappedMonoid m) = Apply (Apply (Mappend_6989586621680631288Sym0 :: TyFun (WrappedMonoid m) (WrappedMonoid m ~> WrappedMonoid m) -> Type) arg1) arg2
type ShowList (arg1 :: [WrappedMonoid m]) arg2 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type ShowList (arg1 :: [WrappedMonoid m]) arg2 = Apply (Apply (ShowList_6989586621680577854Sym0 :: TyFun [WrappedMonoid m] (Symbol ~> Symbol) -> Type) arg1) arg2
type (a1 :: WrappedMonoid m) <> (a2 :: WrappedMonoid m) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type (a1 :: WrappedMonoid m) <> (a2 :: WrappedMonoid m) = Apply (Apply (TFHelper_6989586621681108962Sym0 :: TyFun (WrappedMonoid m) (WrappedMonoid m ~> WrappedMonoid m) -> Type) a1) a2
type EnumFromTo (a2 :: WrappedMonoid a1) (a3 :: WrappedMonoid a1) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type EnumFromTo (a2 :: WrappedMonoid a1) (a3 :: WrappedMonoid a1) = Apply (Apply (EnumFromTo_6989586621681109006Sym0 :: TyFun (WrappedMonoid a1) (WrappedMonoid a1 ~> [WrappedMonoid a1]) -> Type) a2) a3
type Min (arg1 :: WrappedMonoid m) (arg2 :: WrappedMonoid m) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Min (arg1 :: WrappedMonoid m) (arg2 :: WrappedMonoid m) = Apply (Apply (Min_6989586621679792614Sym0 :: TyFun (WrappedMonoid m) (WrappedMonoid m ~> WrappedMonoid m) -> Type) arg1) arg2
type Max (arg1 :: WrappedMonoid m) (arg2 :: WrappedMonoid m) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Max (arg1 :: WrappedMonoid m) (arg2 :: WrappedMonoid m) = Apply (Apply (Max_6989586621679792596Sym0 :: TyFun (WrappedMonoid m) (WrappedMonoid m ~> WrappedMonoid m) -> Type) arg1) arg2
type (arg1 :: WrappedMonoid m) >= (arg2 :: WrappedMonoid m) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type (arg1 :: WrappedMonoid m) >= (arg2 :: WrappedMonoid m) = Apply (Apply (TFHelper_6989586621679792578Sym0 :: TyFun (WrappedMonoid m) (WrappedMonoid m ~> Bool) -> Type) arg1) arg2
type (arg1 :: WrappedMonoid m) > (arg2 :: WrappedMonoid m) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type (arg1 :: WrappedMonoid m) > (arg2 :: WrappedMonoid m) = Apply (Apply (TFHelper_6989586621679792560Sym0 :: TyFun (WrappedMonoid m) (WrappedMonoid m ~> Bool) -> Type) arg1) arg2
type (arg1 :: WrappedMonoid m) <= (arg2 :: WrappedMonoid m) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type (arg1 :: WrappedMonoid m) <= (arg2 :: WrappedMonoid m) = Apply (Apply (TFHelper_6989586621679792542Sym0 :: TyFun (WrappedMonoid m) (WrappedMonoid m ~> Bool) -> Type) arg1) arg2
type (arg1 :: WrappedMonoid m) < (arg2 :: WrappedMonoid m) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type (arg1 :: WrappedMonoid m) < (arg2 :: WrappedMonoid m) = Apply (Apply (TFHelper_6989586621679792524Sym0 :: TyFun (WrappedMonoid m) (WrappedMonoid m ~> Bool) -> Type) arg1) arg2
type Compare (a1 :: WrappedMonoid m) (a2 :: WrappedMonoid m) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Compare (a1 :: WrappedMonoid m) (a2 :: WrappedMonoid m) = Apply (Apply (Compare_6989586621680206787Sym0 :: TyFun (WrappedMonoid m) (WrappedMonoid m ~> Ordering) -> Type) a1) a2
type (x :: WrappedMonoid m) /= (y :: WrappedMonoid m) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type (x :: WrappedMonoid m) /= (y :: WrappedMonoid m) = Not (x == y)
type (a :: WrappedMonoid m) == (b :: WrappedMonoid m) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type (a :: WrappedMonoid m) == (b :: WrappedMonoid m) = Equals_6989586621680203628 a b
type ShowsPrec a1 (a2 :: WrappedMonoid m) a3 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type ShowsPrec a1 (a2 :: WrappedMonoid m) a3 = Apply (Apply (Apply (ShowsPrec_6989586621681091494Sym0 :: TyFun Nat (WrappedMonoid m ~> (Symbol ~> Symbol)) -> Type) a1) a2) a3
type EnumFromThenTo (a2 :: WrappedMonoid a1) (a3 :: WrappedMonoid a1) (a4 :: WrappedMonoid a1) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type EnumFromThenTo (a2 :: WrappedMonoid a1) (a3 :: WrappedMonoid a1) (a4 :: WrappedMonoid a1) = Apply (Apply (Apply (EnumFromThenTo_6989586621681109019Sym0 :: TyFun (WrappedMonoid a1) (WrappedMonoid a1 ~> (WrappedMonoid a1 ~> [WrappedMonoid a1])) -> Type) a2) a3) a4
type Apply (UnwrapMonoidSym0 :: TyFun (WrappedMonoid m) m -> Type) (a6989586621680197190 :: WrappedMonoid m) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (UnwrapMonoidSym0 :: TyFun (WrappedMonoid m) m -> Type) (a6989586621680197190 :: WrappedMonoid m) = UnwrapMonoid a6989586621680197190
type Apply (FromEnum_6989586621681108998Sym0 :: TyFun (WrappedMonoid a) Nat -> Type) (a6989586621681108997 :: WrappedMonoid a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (FromEnum_6989586621681108998Sym0 :: TyFun (WrappedMonoid a) Nat -> Type) (a6989586621681108997 :: WrappedMonoid a) = FromEnum_6989586621681108998 a6989586621681108997
type Apply (Compare_6989586621680206787Sym1 a6989586621680206785 :: TyFun (WrappedMonoid m) Ordering -> Type) (a6989586621680206786 :: WrappedMonoid m) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (Compare_6989586621680206787Sym1 a6989586621680206785 :: TyFun (WrappedMonoid m) Ordering -> Type) (a6989586621680206786 :: WrappedMonoid m) = Compare_6989586621680206787 a6989586621680206785 a6989586621680206786
type Apply (Succ_6989586621681108975Sym0 :: TyFun (WrappedMonoid a) (WrappedMonoid a) -> Type) (a6989586621681108974 :: WrappedMonoid a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (Succ_6989586621681108975Sym0 :: TyFun (WrappedMonoid a) (WrappedMonoid a) -> Type) (a6989586621681108974 :: WrappedMonoid a) = Succ_6989586621681108975 a6989586621681108974
type Apply (Pred_6989586621681108982Sym0 :: TyFun (WrappedMonoid a) (WrappedMonoid a) -> Type) (a6989586621681108981 :: WrappedMonoid a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (Pred_6989586621681108982Sym0 :: TyFun (WrappedMonoid a) (WrappedMonoid a) -> Type) (a6989586621681108981 :: WrappedMonoid a) = Pred_6989586621681108982 a6989586621681108981
type Apply (TFHelper_6989586621681108962Sym1 a6989586621681108960 :: TyFun (WrappedMonoid m) (WrappedMonoid m) -> Type) (a6989586621681108961 :: WrappedMonoid m) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (TFHelper_6989586621681108962Sym1 a6989586621681108960 :: TyFun (WrappedMonoid m) (WrappedMonoid m) -> Type) (a6989586621681108961 :: WrappedMonoid m) = TFHelper_6989586621681108962 a6989586621681108960 a6989586621681108961
type Apply (EnumFromTo_6989586621681109006Sym1 a6989586621681109004 :: TyFun (WrappedMonoid a) [WrappedMonoid a] -> Type) (a6989586621681109005 :: WrappedMonoid a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (EnumFromTo_6989586621681109006Sym1 a6989586621681109004 :: TyFun (WrappedMonoid a) [WrappedMonoid a] -> Type) (a6989586621681109005 :: WrappedMonoid a) = EnumFromTo_6989586621681109006 a6989586621681109004 a6989586621681109005
type Apply (EnumFromThenTo_6989586621681109019Sym2 a6989586621681109017 a6989586621681109016 :: TyFun (WrappedMonoid a) [WrappedMonoid a] -> Type) (a6989586621681109018 :: WrappedMonoid a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (EnumFromThenTo_6989586621681109019Sym2 a6989586621681109017 a6989586621681109016 :: TyFun (WrappedMonoid a) [WrappedMonoid a] -> Type) (a6989586621681109018 :: WrappedMonoid a) = EnumFromThenTo_6989586621681109019 a6989586621681109017 a6989586621681109016 a6989586621681109018
type Apply (Compare_6989586621680206787Sym0 :: TyFun (WrappedMonoid m6989586621679090730) (WrappedMonoid m6989586621679090730 ~> Ordering) -> Type) (a6989586621680206785 :: WrappedMonoid m6989586621679090730) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (Compare_6989586621680206787Sym0 :: TyFun (WrappedMonoid m6989586621679090730) (WrappedMonoid m6989586621679090730 ~> Ordering) -> Type) (a6989586621680206785 :: WrappedMonoid m6989586621679090730) = Compare_6989586621680206787Sym1 a6989586621680206785
type Apply (TFHelper_6989586621681108962Sym0 :: TyFun (WrappedMonoid m6989586621681107186) (WrappedMonoid m6989586621681107186 ~> WrappedMonoid m6989586621681107186) -> Type) (a6989586621681108960 :: WrappedMonoid m6989586621681107186) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (TFHelper_6989586621681108962Sym0 :: TyFun (WrappedMonoid m6989586621681107186) (WrappedMonoid m6989586621681107186 ~> WrappedMonoid m6989586621681107186) -> Type) (a6989586621681108960 :: WrappedMonoid m6989586621681107186) = TFHelper_6989586621681108962Sym1 a6989586621681108960
type Apply (EnumFromTo_6989586621681109006Sym0 :: TyFun (WrappedMonoid a6989586621681107190) (WrappedMonoid a6989586621681107190 ~> [WrappedMonoid a6989586621681107190]) -> Type) (a6989586621681109004 :: WrappedMonoid a6989586621681107190) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (EnumFromTo_6989586621681109006Sym0 :: TyFun (WrappedMonoid a6989586621681107190) (WrappedMonoid a6989586621681107190 ~> [WrappedMonoid a6989586621681107190]) -> Type) (a6989586621681109004 :: WrappedMonoid a6989586621681107190) = EnumFromTo_6989586621681109006Sym1 a6989586621681109004
type Apply (EnumFromThenTo_6989586621681109019Sym0 :: TyFun (WrappedMonoid a6989586621681107190) (WrappedMonoid a6989586621681107190 ~> (WrappedMonoid a6989586621681107190 ~> [WrappedMonoid a6989586621681107190])) -> Type) (a6989586621681109016 :: WrappedMonoid a6989586621681107190) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (EnumFromThenTo_6989586621681109019Sym0 :: TyFun (WrappedMonoid a6989586621681107190) (WrappedMonoid a6989586621681107190 ~> (WrappedMonoid a6989586621681107190 ~> [WrappedMonoid a6989586621681107190])) -> Type) (a6989586621681109016 :: WrappedMonoid a6989586621681107190) = EnumFromThenTo_6989586621681109019Sym1 a6989586621681109016
type Apply (ShowsPrec_6989586621681091494Sym1 a6989586621681091491 m6989586621679090730 :: TyFun (WrappedMonoid m6989586621679090730) (Symbol ~> Symbol) -> Type) (a6989586621681091492 :: WrappedMonoid m6989586621679090730) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ShowsPrec_6989586621681091494Sym1 a6989586621681091491 m6989586621679090730 :: TyFun (WrappedMonoid m6989586621679090730) (Symbol ~> Symbol) -> Type) (a6989586621681091492 :: WrappedMonoid m6989586621679090730) = ShowsPrec_6989586621681091494Sym2 a6989586621681091491 a6989586621681091492
type Apply (EnumFromThenTo_6989586621681109019Sym1 a6989586621681109016 :: TyFun (WrappedMonoid a6989586621681107190) (WrappedMonoid a6989586621681107190 ~> [WrappedMonoid a6989586621681107190]) -> Type) (a6989586621681109017 :: WrappedMonoid a6989586621681107190) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (EnumFromThenTo_6989586621681109019Sym1 a6989586621681109016 :: TyFun (WrappedMonoid a6989586621681107190) (WrappedMonoid a6989586621681107190 ~> [WrappedMonoid a6989586621681107190]) -> Type) (a6989586621681109017 :: WrappedMonoid a6989586621681107190) = EnumFromThenTo_6989586621681109019Sym2 a6989586621681109016 a6989586621681109017

newtype Option a #

Option is effectively Maybe with a better instance of Monoid, built off of an underlying Semigroup instead of an underlying Monoid.

Ideally, this type would not exist at all and we would just fix the Monoid instance of Maybe.

In GHC 8.4 and higher, the Monoid instance for Maybe has been corrected to lift a Semigroup instance instead of a Monoid instance. Consequently, this type is no longer useful. It will be marked deprecated in GHC 8.8 and removed in GHC 8.10.

Constructors

Option 

Fields

Instances

Instances details
Monad Option

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

(>>=) :: Option a -> (a -> Option b) -> Option b #

(>>) :: Option a -> Option b -> Option b #

return :: a -> Option a #

Functor Option

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

fmap :: (a -> b) -> Option a -> Option b #

(<$) :: a -> Option b -> Option a #

MonadFix Option

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

mfix :: (a -> Option a) -> Option a #

Applicative Option

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

pure :: a -> Option a #

(<*>) :: Option (a -> b) -> Option a -> Option b #

liftA2 :: (a -> b -> c) -> Option a -> Option b -> Option c #

(*>) :: Option a -> Option b -> Option b #

(<*) :: Option a -> Option b -> Option a #

Foldable Option

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

fold :: Monoid m => Option m -> m #

foldMap :: Monoid m => (a -> m) -> Option a -> m #

foldMap' :: Monoid m => (a -> m) -> Option a -> m #

foldr :: (a -> b -> b) -> b -> Option a -> b #

foldr' :: (a -> b -> b) -> b -> Option a -> b #

foldl :: (b -> a -> b) -> b -> Option a -> b #

foldl' :: (b -> a -> b) -> b -> Option a -> b #

foldr1 :: (a -> a -> a) -> Option a -> a #

foldl1 :: (a -> a -> a) -> Option a -> a #

toList :: Option a -> [a] #

null :: Option a -> Bool #

length :: Option a -> Int #

elem :: Eq a => a -> Option a -> Bool #

maximum :: Ord a => Option a -> a #

minimum :: Ord a => Option a -> a #

sum :: Num a => Option a -> a #

product :: Num a => Option a -> a #

Traversable Option

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

traverse :: Applicative f => (a -> f b) -> Option a -> f (Option b) #

sequenceA :: Applicative f => Option (f a) -> f (Option a) #

mapM :: Monad m => (a -> m b) -> Option a -> m (Option b) #

sequence :: Monad m => Option (m a) -> m (Option a) #

Alternative Option

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

empty :: Option a #

(<|>) :: Option a -> Option a -> Option a #

some :: Option a -> Option [a] #

many :: Option a -> Option [a] #

MonadPlus Option

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

mzero :: Option a #

mplus :: Option a -> Option a -> Option a #

NFData1 Option

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

liftRnf :: (a -> ()) -> Option a -> () #

Eq a => Eq (Option a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

(==) :: Option a -> Option a -> Bool #

(/=) :: Option a -> Option a -> Bool #

Data a => Data (Option a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Option a -> c (Option a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Option a) #

toConstr :: Option a -> Constr #

dataTypeOf :: Option a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Option a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Option a)) #

gmapT :: (forall b. Data b => b -> b) -> Option a -> Option a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Option a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Option a -> r #

gmapQ :: (forall d. Data d => d -> u) -> Option a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Option a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Option a -> m (Option a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Option a -> m (Option a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Option a -> m (Option a) #

Ord a => Ord (Option a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

compare :: Option a -> Option a -> Ordering #

(<) :: Option a -> Option a -> Bool #

(<=) :: Option a -> Option a -> Bool #

(>) :: Option a -> Option a -> Bool #

(>=) :: Option a -> Option a -> Bool #

max :: Option a -> Option a -> Option a #

min :: Option a -> Option a -> Option a #

Read a => Read (Option a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Show a => Show (Option a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

showsPrec :: Int -> Option a -> ShowS #

show :: Option a -> String #

showList :: [Option a] -> ShowS #

Generic (Option a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Associated Types

type Rep (Option a) :: Type -> Type #

Methods

from :: Option a -> Rep (Option a) x #

to :: Rep (Option a) x -> Option a #

Semigroup a => Semigroup (Option a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

(<>) :: Option a -> Option a -> Option a #

sconcat :: NonEmpty (Option a) -> Option a #

stimes :: Integral b => b -> Option a -> Option a #

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 #

Hashable a => Hashable (Option a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Option a -> Int #

hash :: Option a -> Int #

NFData a => NFData (Option a)

Since: deepseq-1.4.2.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Option a -> () #

Wrapped (Option a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (Option a) #

Methods

_Wrapped' :: Iso' (Option a) (Unwrapped (Option a)) #

Generic1 Option

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Associated Types

type Rep1 Option :: k -> Type #

Methods

from1 :: forall (a :: k). Option a -> Rep1 Option a #

to1 :: forall (a :: k). Rep1 Option a -> Option a #

t ~ Option b => Rewrapped (Option a) t 
Instance details

Defined in Control.Lens.Wrapped

SDecide (Maybe a) => TestCoercion (SOption :: Option a -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

Methods

testCoercion :: forall (a0 :: k) (b :: k). SOption a0 -> SOption b -> Maybe (Coercion a0 b) #

SDecide (Maybe a) => TestEquality (SOption :: Option a -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

Methods

testEquality :: forall (a0 :: k) (b :: k). SOption a0 -> SOption b -> Maybe (a0 :~: b) #

SingI (OptionSym0 :: TyFun (Maybe a) (Option a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

Methods

sing :: Sing OptionSym0 #

SuppressUnusedWarnings (OptionSym0 :: TyFun (Maybe a6989586621679060063) (Option a6989586621679060063) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (ShowsPrec_6989586621681091190Sym0 :: TyFun Nat (Option a6989586621679060063 ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (Pure_6989586621681109050Sym0 :: TyFun a6989586621679962808 (Option a6989586621679962808) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (Let6989586621681109045ASym0 :: TyFun a6989586621679060063 (Option a6989586621679060063) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (GetOptionSym0 :: TyFun (Option a6989586621679060063) (Maybe a6989586621679060063) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (Compare_6989586621680206583Sym0 :: TyFun (Option a6989586621679060063) (Option a6989586621679060063 ~> Ordering) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (TFHelper_6989586621681109150Sym0 :: TyFun (Option a6989586621681107210) (Option a6989586621681107210 ~> Option a6989586621681107210) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (TFHelper_6989586621681109037Sym0 :: TyFun (Option a6989586621679962884) (Option a6989586621679962884 ~> Option a6989586621679962884) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SingI (Option_Sym0 :: TyFun b ((a ~> b) ~> (Option a ~> b)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

Methods

sing :: Sing Option_Sym0 #

SuppressUnusedWarnings (TFHelper_6989586621681109110Sym0 :: TyFun a6989586621679962805 (Option b6989586621679962806 ~> Option a6989586621679962805) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (Option_Sym0 :: TyFun b6989586621681175290 ((a6989586621681175291 ~> b6989586621681175290) ~> (Option a6989586621681175291 ~> b6989586621681175290)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (Compare_6989586621680206583Sym1 a6989586621680206581 :: TyFun (Option a6989586621679060063) Ordering -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (TFHelper_6989586621681109150Sym1 a6989586621681109148 :: TyFun (Option a6989586621681107210) (Option a6989586621681107210) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (TFHelper_6989586621681109134Sym0 :: TyFun (Option a6989586621679962834) (Option b6989586621679962835 ~> Option b6989586621679962835) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (TFHelper_6989586621681109122Sym0 :: TyFun (Option a6989586621679962832) ((a6989586621679962832 ~> Option b6989586621679962833) ~> Option b6989586621679962833) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (TFHelper_6989586621681109087Sym0 :: TyFun (Option a6989586621679962814) (Option b6989586621679962815 ~> Option b6989586621679962815) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (TFHelper_6989586621681109037Sym1 a6989586621681109035 :: TyFun (Option a6989586621679962884) (Option a6989586621679962884) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (ShowsPrec_6989586621681091190Sym1 a6989586621681091187 a6989586621679060063 :: TyFun (Option a6989586621679060063) (Symbol ~> Symbol) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (TFHelper_6989586621681109058Sym0 :: TyFun (Option (a6989586621679962809 ~> b6989586621679962810)) (Option a6989586621679962809 ~> Option b6989586621679962810) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (FoldMap_6989586621681109164Sym0 :: TyFun (a6989586621680742384 ~> m6989586621680742383) (Option a6989586621680742384 ~> m6989586621680742383) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (Fmap_6989586621681109098Sym0 :: TyFun (a6989586621679962803 ~> b6989586621679962804) (Option a6989586621679962803 ~> Option b6989586621679962804) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SingI d => SingI (Option_Sym1 d a :: TyFun (a ~> b) (Option a ~> b) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

Methods

sing :: Sing (Option_Sym1 d a) #

SuppressUnusedWarnings (TFHelper_6989586621681109134Sym1 a6989586621681109132 b6989586621679962835 :: TyFun (Option b6989586621679962835) (Option b6989586621679962835) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (TFHelper_6989586621681109110Sym1 a6989586621681109108 b6989586621679962806 :: TyFun (Option b6989586621679962806) (Option a6989586621679962805) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (TFHelper_6989586621681109087Sym1 a6989586621681109085 b6989586621679962815 :: TyFun (Option b6989586621679962815) (Option b6989586621679962815) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (TFHelper_6989586621681109058Sym1 a6989586621681109056 :: TyFun (Option a6989586621679962809) (Option b6989586621679962810) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (FoldMap_6989586621681109164Sym1 a6989586621681109162 :: TyFun (Option a6989586621680742384) m6989586621680742383 -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (Fmap_6989586621681109098Sym1 a6989586621681109096 :: TyFun (Option a6989586621679962803) (Option b6989586621679962804) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (Traverse_6989586621681109176Sym0 :: TyFun (a6989586621680988964 ~> f6989586621680988963 b6989586621680988965) (Option a6989586621680988964 ~> f6989586621680988963 (Option b6989586621680988965)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (TFHelper_6989586621681109122Sym1 a6989586621681109120 b6989586621679962833 :: TyFun (a6989586621679962832 ~> Option b6989586621679962833) (Option b6989586621679962833) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (Option_Sym1 a6989586621681175302 a6989586621681175291 :: TyFun (a6989586621681175291 ~> b6989586621681175290) (Option a6989586621681175291 ~> b6989586621681175290) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (LiftA2_6989586621681109071Sym0 :: TyFun (a6989586621679962811 ~> (b6989586621679962812 ~> c6989586621679962813)) (Option a6989586621679962811 ~> (Option b6989586621679962812 ~> Option c6989586621679962813)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

(SingI d1, SingI d2) => SingI (Option_Sym2 d1 d2 :: TyFun (Option a) b -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

Methods

sing :: Sing (Option_Sym2 d1 d2) #

SuppressUnusedWarnings (Traverse_6989586621681109176Sym1 a6989586621681109174 :: TyFun (Option a6989586621680988964) (f6989586621680988963 (Option b6989586621680988965)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (Option_Sym2 a6989586621681175303 a6989586621681175302 :: TyFun (Option a6989586621681175291) b6989586621681175290 -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (LiftA2_6989586621681109071Sym1 a6989586621681109068 :: TyFun (Option a6989586621679962811) (Option b6989586621679962812 ~> Option c6989586621679962813) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (LiftA2_6989586621681109071Sym2 a6989586621681109069 a6989586621681109068 :: TyFun (Option b6989586621679962812) (Option c6989586621679962813) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Empty 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Empty = Empty_6989586621681109033Sym0 :: Option a
type Mzero 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Mzero = Mzero_6989586621679963350Sym0 :: Option a0
type Product (arg0 :: Option a0) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Product (arg0 :: Option a0) = Apply (Product_6989586621680743347Sym0 :: TyFun (Option a0) a0 -> Type) arg0
type Sum (arg0 :: Option a0) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Sum (arg0 :: Option a0) = Apply (Sum_6989586621680743334Sym0 :: TyFun (Option a0) a0 -> Type) arg0
type Minimum (arg0 :: Option a0) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Minimum (arg0 :: Option a0) = Apply (Minimum_6989586621680743321Sym0 :: TyFun (Option a0) a0 -> Type) arg0
type Maximum (arg0 :: Option a0) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Maximum (arg0 :: Option a0) = Apply (Maximum_6989586621680743308Sym0 :: TyFun (Option a0) a0 -> Type) arg0
type Length (arg0 :: Option a0) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Length (arg0 :: Option a0) = Apply (Length_6989586621680743270Sym0 :: TyFun (Option a0) Nat -> Type) arg0
type Null (arg0 :: Option a0) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Null (arg0 :: Option a0) = Apply (Null_6989586621680743249Sym0 :: TyFun (Option a0) Bool -> Type) arg0
type ToList (arg0 :: Option a0) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type ToList (arg0 :: Option a0) = Apply (ToList_6989586621680743240Sym0 :: TyFun (Option a0) [a0] -> Type) arg0
type Fold (arg0 :: Option m0) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Fold (arg0 :: Option m0) = Apply (Fold_6989586621680743057Sym0 :: TyFun (Option m0) m0 -> Type) arg0
type Pure (a :: k1) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Pure (a :: k1) = Apply (Pure_6989586621681109050Sym0 :: TyFun k1 (Option k1) -> Type) a
type Return (arg0 :: a0) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Return (arg0 :: a0) = Apply (Return_6989586621679963334Sym0 :: TyFun a0 (Option a0) -> Type) arg0
type Sequence (arg0 :: Option (m0 a0)) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Sequence (arg0 :: Option (m0 a0)) = Apply (Sequence_6989586621680989026Sym0 :: TyFun (Option (m0 a0)) (m0 (Option a0)) -> Type) arg0
type SequenceA (arg0 :: Option (f0 a0)) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type SequenceA (arg0 :: Option (f0 a0)) = Apply (SequenceA_6989586621680989001Sym0 :: TyFun (Option (f0 a0)) (f0 (Option a0)) -> Type) arg0
type Elem (arg1 :: a0) (arg2 :: Option a0) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Elem (arg1 :: a0) (arg2 :: Option a0) = Apply (Apply (Elem_6989586621680743293Sym0 :: TyFun a0 (Option a0 ~> Bool) -> Type) arg1) arg2
type Foldl1 (arg1 :: a0 ~> (a0 ~> a0)) (arg2 :: Option a0) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Foldl1 (arg1 :: a0 ~> (a0 ~> a0)) (arg2 :: Option a0) = Apply (Apply (Foldl1_6989586621680743216Sym0 :: TyFun (a0 ~> (a0 ~> a0)) (Option a0 ~> a0) -> Type) arg1) arg2
type Foldr1 (arg1 :: a0 ~> (a0 ~> a0)) (arg2 :: Option a0) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Foldr1 (arg1 :: a0 ~> (a0 ~> a0)) (arg2 :: Option a0) = Apply (Apply (Foldr1_6989586621680743191Sym0 :: TyFun (a0 ~> (a0 ~> a0)) (Option a0 ~> a0) -> Type) arg1) arg2
type (a1 :: Option a6989586621679962884) <|> (a2 :: Option a6989586621679962884) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type (a1 :: Option a6989586621679962884) <|> (a2 :: Option a6989586621679962884) = Apply (Apply (TFHelper_6989586621681109037Sym0 :: TyFun (Option a6989586621679962884) (Option a6989586621679962884 ~> Option a6989586621679962884) -> Type) a1) a2
type Mplus (arg1 :: Option a0) (arg2 :: Option a0) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Mplus (arg1 :: Option a0) (arg2 :: Option a0) = Apply (Apply (Mplus_6989586621679963354Sym0 :: TyFun (Option a0) (Option a0 ~> Option a0) -> Type) arg1) arg2
type FoldMap (a1 :: a6989586621680742384 ~> k2) (a2 :: Option a6989586621680742384) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type FoldMap (a1 :: a6989586621680742384 ~> k2) (a2 :: Option a6989586621680742384) = Apply (Apply (FoldMap_6989586621681109164Sym0 :: TyFun (a6989586621680742384 ~> k2) (Option a6989586621680742384 ~> k2) -> Type) a1) a2
type (a1 :: k1) <$ (a2 :: Option b6989586621679962806) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type (a1 :: k1) <$ (a2 :: Option b6989586621679962806) = Apply (Apply (TFHelper_6989586621681109110Sym0 :: TyFun k1 (Option b6989586621679962806 ~> Option k1) -> Type) a1) a2
type Fmap (a1 :: a6989586621679962803 ~> b6989586621679962804) (a2 :: Option a6989586621679962803) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Fmap (a1 :: a6989586621679962803 ~> b6989586621679962804) (a2 :: Option a6989586621679962803) = Apply (Apply (Fmap_6989586621681109098Sym0 :: TyFun (a6989586621679962803 ~> b6989586621679962804) (Option a6989586621679962803 ~> Option b6989586621679962804) -> Type) a1) a2
type (arg1 :: Option a0) <* (arg2 :: Option b0) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type (arg1 :: Option a0) <* (arg2 :: Option b0) = Apply (Apply (TFHelper_6989586621679963287Sym0 :: TyFun (Option a0) (Option b0 ~> Option a0) -> Type) arg1) arg2
type (a1 :: Option a6989586621679962814) *> (a2 :: Option b6989586621679962815) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type (a1 :: Option a6989586621679962814) *> (a2 :: Option b6989586621679962815) = Apply (Apply (TFHelper_6989586621681109087Sym0 :: TyFun (Option a6989586621679962814) (Option b6989586621679962815 ~> Option b6989586621679962815) -> Type) a1) a2
type (a1 :: Option (a6989586621679962809 ~> b6989586621679962810)) <*> (a2 :: Option a6989586621679962809) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type (a1 :: Option (a6989586621679962809 ~> b6989586621679962810)) <*> (a2 :: Option a6989586621679962809) = Apply (Apply (TFHelper_6989586621681109058Sym0 :: TyFun (Option (a6989586621679962809 ~> b6989586621679962810)) (Option a6989586621679962809 ~> Option b6989586621679962810) -> Type) a1) a2
type (a1 :: Option a6989586621679962834) >> (a2 :: Option b6989586621679962835) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type (a1 :: Option a6989586621679962834) >> (a2 :: Option b6989586621679962835) = Apply (Apply (TFHelper_6989586621681109134Sym0 :: TyFun (Option a6989586621679962834) (Option b6989586621679962835 ~> Option b6989586621679962835) -> Type) a1) a2
type (a1 :: Option a6989586621679962832) >>= (a2 :: a6989586621679962832 ~> Option b6989586621679962833) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type (a1 :: Option a6989586621679962832) >>= (a2 :: a6989586621679962832 ~> Option b6989586621679962833) = Apply (Apply (TFHelper_6989586621681109122Sym0 :: TyFun (Option a6989586621679962832) ((a6989586621679962832 ~> Option b6989586621679962833) ~> Option b6989586621679962833) -> Type) a1) a2
type MapM (arg1 :: a0 ~> m0 b0) (arg2 :: Option a0) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type MapM (arg1 :: a0 ~> m0 b0) (arg2 :: Option a0) = Apply (Apply (MapM_6989586621680989011Sym0 :: TyFun (a0 ~> m0 b0) (Option a0 ~> m0 (Option b0)) -> Type) arg1) arg2
type Traverse (a1 :: a6989586621680988964 ~> f6989586621680988963 b6989586621680988965) (a2 :: Option a6989586621680988964) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Traverse (a1 :: a6989586621680988964 ~> f6989586621680988963 b6989586621680988965) (a2 :: Option a6989586621680988964) = Apply (Apply (Traverse_6989586621681109176Sym0 :: TyFun (a6989586621680988964 ~> f6989586621680988963 b6989586621680988965) (Option a6989586621680988964 ~> f6989586621680988963 (Option b6989586621680988965)) -> Type) a1) a2
type Foldl' (arg1 :: b0 ~> (a0 ~> b0)) (arg2 :: b0) (arg3 :: Option a0) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Foldl' (arg1 :: b0 ~> (a0 ~> b0)) (arg2 :: b0) (arg3 :: Option a0) = Apply (Apply (Apply (Foldl'_6989586621680743162Sym0 :: TyFun (b0 ~> (a0 ~> b0)) (b0 ~> (Option a0 ~> b0)) -> Type) arg1) arg2) arg3
type Foldl (arg1 :: b0 ~> (a0 ~> b0)) (arg2 :: b0) (arg3 :: Option a0) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Foldl (arg1 :: b0 ~> (a0 ~> b0)) (arg2 :: b0) (arg3 :: Option a0) = Apply (Apply (Apply (Foldl_6989586621680743137Sym0 :: TyFun (b0 ~> (a0 ~> b0)) (b0 ~> (Option a0 ~> b0)) -> Type) arg1) arg2) arg3
type Foldr' (arg1 :: a0 ~> (b0 ~> b0)) (arg2 :: b0) (arg3 :: Option a0) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Foldr' (arg1 :: a0 ~> (b0 ~> b0)) (arg2 :: b0) (arg3 :: Option a0) = Apply (Apply (Apply (Foldr'_6989586621680743107Sym0 :: TyFun (a0 ~> (b0 ~> b0)) (b0 ~> (Option a0 ~> b0)) -> Type) arg1) arg2) arg3
type Foldr (arg1 :: a0 ~> (b0 ~> b0)) (arg2 :: b0) (arg3 :: Option a0) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Foldr (arg1 :: a0 ~> (b0 ~> b0)) (arg2 :: b0) (arg3 :: Option a0) = Apply (Apply (Apply (Foldr_6989586621680743082Sym0 :: TyFun (a0 ~> (b0 ~> b0)) (b0 ~> (Option a0 ~> b0)) -> Type) arg1) arg2) arg3
type LiftA2 (a1 :: a6989586621679962811 ~> (b6989586621679962812 ~> c6989586621679962813)) (a2 :: Option a6989586621679962811) (a3 :: Option b6989586621679962812) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type LiftA2 (a1 :: a6989586621679962811 ~> (b6989586621679962812 ~> c6989586621679962813)) (a2 :: Option a6989586621679962811) (a3 :: Option b6989586621679962812) = Apply (Apply (Apply (LiftA2_6989586621681109071Sym0 :: TyFun (a6989586621679962811 ~> (b6989586621679962812 ~> c6989586621679962813)) (Option a6989586621679962811 ~> (Option b6989586621679962812 ~> Option c6989586621679962813)) -> Type) a1) a2) a3
type Apply (Let6989586621681109045ASym0 :: TyFun a6989586621679060063 (Option a6989586621679060063) -> Type) (wild_69895866216811072446989586621681109044 :: a6989586621679060063) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (Let6989586621681109045ASym0 :: TyFun a6989586621679060063 (Option a6989586621679060063) -> Type) (wild_69895866216811072446989586621681109044 :: a6989586621679060063) = Let6989586621681109045A wild_69895866216811072446989586621681109044
type Apply (Pure_6989586621681109050Sym0 :: TyFun a (Option a) -> Type) (a6989586621681109049 :: a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (Pure_6989586621681109050Sym0 :: TyFun a (Option a) -> Type) (a6989586621681109049 :: a) = Pure_6989586621681109050 a6989586621681109049
type Apply (ShowsPrec_6989586621681091190Sym0 :: TyFun Nat (Option a6989586621679060063 ~> (Symbol ~> Symbol)) -> Type) (a6989586621681091187 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ShowsPrec_6989586621681091190Sym0 :: TyFun Nat (Option a6989586621679060063 ~> (Symbol ~> Symbol)) -> Type) (a6989586621681091187 :: Nat) = ShowsPrec_6989586621681091190Sym1 a6989586621681091187 a6989586621679060063 :: TyFun (Option a6989586621679060063) (Symbol ~> Symbol) -> Type
type Apply (TFHelper_6989586621681109110Sym0 :: TyFun a6989586621679962805 (Option b6989586621679962806 ~> Option a6989586621679962805) -> Type) (a6989586621681109108 :: a6989586621679962805) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (TFHelper_6989586621681109110Sym0 :: TyFun a6989586621679962805 (Option b6989586621679962806 ~> Option a6989586621679962805) -> Type) (a6989586621681109108 :: a6989586621679962805) = TFHelper_6989586621681109110Sym1 a6989586621681109108 b6989586621679962806 :: TyFun (Option b6989586621679962806) (Option a6989586621679962805) -> Type
type Apply (Option_Sym0 :: TyFun b6989586621681175290 ((a6989586621681175291 ~> b6989586621681175290) ~> (Option a6989586621681175291 ~> b6989586621681175290)) -> Type) (a6989586621681175302 :: b6989586621681175290) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (Option_Sym0 :: TyFun b6989586621681175290 ((a6989586621681175291 ~> b6989586621681175290) ~> (Option a6989586621681175291 ~> b6989586621681175290)) -> Type) (a6989586621681175302 :: b6989586621681175290) = Option_Sym1 a6989586621681175302 a6989586621681175291 :: TyFun (a6989586621681175291 ~> b6989586621681175290) (Option a6989586621681175291 ~> b6989586621681175290) -> Type
type Rep (Option a) 
Instance details

Defined in Data.Semigroup

type Rep (Option a) = D1 ('MetaData "Option" "Data.Semigroup" "base" 'True) (C1 ('MetaCons "Option" 'PrefixI 'True) (S1 ('MetaSel ('Just "getOption") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe a))))
type Unwrapped (Option a) 
Instance details

Defined in Control.Lens.Wrapped

type Unwrapped (Option a) = Maybe a
type Sing 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Sing = SOption :: Option a -> Type
type Mempty 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Mempty = Mempty_6989586621681109160Sym0 :: Option a
type Demote (Option a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Demote (Option a) = Option (Demote a)
type Rep1 Option 
Instance details

Defined in Data.Semigroup

type Rep1 Option = D1 ('MetaData "Option" "Data.Semigroup" "base" 'True) (C1 ('MetaCons "Option" 'PrefixI 'True) (S1 ('MetaSel ('Just "getOption") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 Maybe)))
type Mconcat (arg0 :: [Option a]) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Mconcat (arg0 :: [Option a]) = Apply (Mconcat_6989586621680631303Sym0 :: TyFun [Option a] (Option a) -> Type) arg0
type Show_ (arg0 :: Option a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Show_ (arg0 :: Option a) = Apply (Show__6989586621680577846Sym0 :: TyFun (Option a) Symbol -> Type) arg0
type Sconcat (arg0 :: NonEmpty (Option a)) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Sconcat (arg0 :: NonEmpty (Option a)) = Apply (Sconcat_6989586621680187691Sym0 :: TyFun (NonEmpty (Option a)) (Option a) -> Type) arg0
type Mappend (arg1 :: Option a) (arg2 :: Option a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Mappend (arg1 :: Option a) (arg2 :: Option a) = Apply (Apply (Mappend_6989586621680631288Sym0 :: TyFun (Option a) (Option a ~> Option a) -> Type) arg1) arg2
type ShowList (arg1 :: [Option a]) arg2 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type ShowList (arg1 :: [Option a]) arg2 = Apply (Apply (ShowList_6989586621680577854Sym0 :: TyFun [Option a] (Symbol ~> Symbol) -> Type) arg1) arg2
type (a2 :: Option a1) <> (a3 :: Option a1) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type (a2 :: Option a1) <> (a3 :: Option a1) = Apply (Apply (TFHelper_6989586621681109150Sym0 :: TyFun (Option a1) (Option a1 ~> Option a1) -> Type) a2) a3
type Min (arg1 :: Option a) (arg2 :: Option a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Min (arg1 :: Option a) (arg2 :: Option a) = Apply (Apply (Min_6989586621679792614Sym0 :: TyFun (Option a) (Option a ~> Option a) -> Type) arg1) arg2
type Max (arg1 :: Option a) (arg2 :: Option a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Max (arg1 :: Option a) (arg2 :: Option a) = Apply (Apply (Max_6989586621679792596Sym0 :: TyFun (Option a) (Option a ~> Option a) -> Type) arg1) arg2
type (arg1 :: Option a) >= (arg2 :: Option a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type (arg1 :: Option a) >= (arg2 :: Option a) = Apply (Apply (TFHelper_6989586621679792578Sym0 :: TyFun (Option a) (Option a ~> Bool) -> Type) arg1) arg2
type (arg1 :: Option a) > (arg2 :: Option a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type (arg1 :: Option a) > (arg2 :: Option a) = Apply (Apply (TFHelper_6989586621679792560Sym0 :: TyFun (Option a) (Option a ~> Bool) -> Type) arg1) arg2
type (arg1 :: Option a) <= (arg2 :: Option a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type (arg1 :: Option a) <= (arg2 :: Option a) = Apply (Apply (TFHelper_6989586621679792542Sym0 :: TyFun (Option a) (Option a ~> Bool) -> Type) arg1) arg2
type (arg1 :: Option a) < (arg2 :: Option a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type (arg1 :: Option a) < (arg2 :: Option a) = Apply (Apply (TFHelper_6989586621679792524Sym0 :: TyFun (Option a) (Option a ~> Bool) -> Type) arg1) arg2
type Compare (a2 :: Option a1) (a3 :: Option a1) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Compare (a2 :: Option a1) (a3 :: Option a1) = Apply (Apply (Compare_6989586621680206583Sym0 :: TyFun (Option a1) (Option a1 ~> Ordering) -> Type) a2) a3
type (x :: Option a) /= (y :: Option a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type (x :: Option a) /= (y :: Option a) = Not (x == y)
type (a2 :: Option a1) == (b :: Option a1) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type (a2 :: Option a1) == (b :: Option a1) = Equals_6989586621680203496 a2 b
type ShowsPrec a2 (a3 :: Option a1) a4 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type ShowsPrec a2 (a3 :: Option a1) a4 = Apply (Apply (Apply (ShowsPrec_6989586621681091190Sym0 :: TyFun Nat (Option a1 ~> (Symbol ~> Symbol)) -> Type) a2) a3) a4
type Apply (Compare_6989586621680206583Sym1 a6989586621680206581 :: TyFun (Option a) Ordering -> Type) (a6989586621680206582 :: Option a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (Compare_6989586621680206583Sym1 a6989586621680206581 :: TyFun (Option a) Ordering -> Type) (a6989586621680206582 :: Option a) = Compare_6989586621680206583 a6989586621680206581 a6989586621680206582
type Apply (FoldMap_6989586621681109164Sym1 a6989586621681109162 :: TyFun (Option a) m -> Type) (a6989586621681109163 :: Option a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (FoldMap_6989586621681109164Sym1 a6989586621681109162 :: TyFun (Option a) m -> Type) (a6989586621681109163 :: Option a) = FoldMap_6989586621681109164 a6989586621681109162 a6989586621681109163
type Apply (Option_Sym2 a6989586621681175303 a6989586621681175302 :: TyFun (Option a) b -> Type) (a6989586621681175304 :: Option a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (Option_Sym2 a6989586621681175303 a6989586621681175302 :: TyFun (Option a) b -> Type) (a6989586621681175304 :: Option a) = Option_ a6989586621681175303 a6989586621681175302 a6989586621681175304
type Apply (OptionSym0 :: TyFun (Maybe a) (Option a) -> Type) (t6989586621680197015 :: Maybe a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (OptionSym0 :: TyFun (Maybe a) (Option a) -> Type) (t6989586621680197015 :: Maybe a) = 'Option t6989586621680197015
type Apply (GetOptionSym0 :: TyFun (Option a) (Maybe a) -> Type) (a6989586621680197012 :: Option a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (GetOptionSym0 :: TyFun (Option a) (Maybe a) -> Type) (a6989586621680197012 :: Option a) = GetOption a6989586621680197012
type Apply (TFHelper_6989586621681109037Sym1 a6989586621681109035 :: TyFun (Option a) (Option a) -> Type) (a6989586621681109036 :: Option a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (TFHelper_6989586621681109037Sym1 a6989586621681109035 :: TyFun (Option a) (Option a) -> Type) (a6989586621681109036 :: Option a) = TFHelper_6989586621681109037 a6989586621681109035 a6989586621681109036
type Apply (TFHelper_6989586621681109150Sym1 a6989586621681109148 :: TyFun (Option a) (Option a) -> Type) (a6989586621681109149 :: Option a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (TFHelper_6989586621681109150Sym1 a6989586621681109148 :: TyFun (Option a) (Option a) -> Type) (a6989586621681109149 :: Option a) = TFHelper_6989586621681109150 a6989586621681109148 a6989586621681109149
type Apply (TFHelper_6989586621681109058Sym1 a6989586621681109056 :: TyFun (Option a) (Option b) -> Type) (a6989586621681109057 :: Option a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (TFHelper_6989586621681109058Sym1 a6989586621681109056 :: TyFun (Option a) (Option b) -> Type) (a6989586621681109057 :: Option a) = TFHelper_6989586621681109058 a6989586621681109056 a6989586621681109057
type Apply (TFHelper_6989586621681109087Sym1 a6989586621681109085 b :: TyFun (Option b) (Option b) -> Type) (a6989586621681109086 :: Option b) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (TFHelper_6989586621681109087Sym1 a6989586621681109085 b :: TyFun (Option b) (Option b) -> Type) (a6989586621681109086 :: Option b) = TFHelper_6989586621681109087 a6989586621681109085 a6989586621681109086
type Apply (Fmap_6989586621681109098Sym1 a6989586621681109096 :: TyFun (Option a) (Option b) -> Type) (a6989586621681109097 :: Option a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (Fmap_6989586621681109098Sym1 a6989586621681109096 :: TyFun (Option a) (Option b) -> Type) (a6989586621681109097 :: Option a) = Fmap_6989586621681109098 a6989586621681109096 a6989586621681109097
type Apply (TFHelper_6989586621681109110Sym1 a6989586621681109108 b :: TyFun (Option b) (Option a) -> Type) (a6989586621681109109 :: Option b) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (TFHelper_6989586621681109110Sym1 a6989586621681109108 b :: TyFun (Option b) (Option a) -> Type) (a6989586621681109109 :: Option b) = TFHelper_6989586621681109110 a6989586621681109108 a6989586621681109109
type Apply (TFHelper_6989586621681109134Sym1 a6989586621681109132 b :: TyFun (Option b) (Option b) -> Type) (a6989586621681109133 :: Option b) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (TFHelper_6989586621681109134Sym1 a6989586621681109132 b :: TyFun (Option b) (Option b) -> Type) (a6989586621681109133 :: Option b) = TFHelper_6989586621681109134 a6989586621681109132 a6989586621681109133
type Apply (Traverse_6989586621681109176Sym1 a6989586621681109174 :: TyFun (Option a) (f (Option b)) -> Type) (a6989586621681109175 :: Option a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (Traverse_6989586621681109176Sym1 a6989586621681109174 :: TyFun (Option a) (f (Option b)) -> Type) (a6989586621681109175 :: Option a) = Traverse_6989586621681109176 a6989586621681109174 a6989586621681109175
type Apply (LiftA2_6989586621681109071Sym2 a6989586621681109069 a6989586621681109068 :: TyFun (Option b) (Option c) -> Type) (a6989586621681109070 :: Option b) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (LiftA2_6989586621681109071Sym2 a6989586621681109069 a6989586621681109068 :: TyFun (Option b) (Option c) -> Type) (a6989586621681109070 :: Option b) = LiftA2_6989586621681109071 a6989586621681109069 a6989586621681109068 a6989586621681109070
type Apply (Compare_6989586621680206583Sym0 :: TyFun (Option a6989586621679060063) (Option a6989586621679060063 ~> Ordering) -> Type) (a6989586621680206581 :: Option a6989586621679060063) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (Compare_6989586621680206583Sym0 :: TyFun (Option a6989586621679060063) (Option a6989586621679060063 ~> Ordering) -> Type) (a6989586621680206581 :: Option a6989586621679060063) = Compare_6989586621680206583Sym1 a6989586621680206581
type Apply (TFHelper_6989586621681109037Sym0 :: TyFun (Option a6989586621679962884) (Option a6989586621679962884 ~> Option a6989586621679962884) -> Type) (a6989586621681109035 :: Option a6989586621679962884) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (TFHelper_6989586621681109037Sym0 :: TyFun (Option a6989586621679962884) (Option a6989586621679962884 ~> Option a6989586621679962884) -> Type) (a6989586621681109035 :: Option a6989586621679962884) = TFHelper_6989586621681109037Sym1 a6989586621681109035
type Apply (TFHelper_6989586621681109150Sym0 :: TyFun (Option a6989586621681107210) (Option a6989586621681107210 ~> Option a6989586621681107210) -> Type) (a6989586621681109148 :: Option a6989586621681107210) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (TFHelper_6989586621681109150Sym0 :: TyFun (Option a6989586621681107210) (Option a6989586621681107210 ~> Option a6989586621681107210) -> Type) (a6989586621681109148 :: Option a6989586621681107210) = TFHelper_6989586621681109150Sym1 a6989586621681109148
type Apply (ShowsPrec_6989586621681091190Sym1 a6989586621681091187 a6989586621679060063 :: TyFun (Option a6989586621679060063) (Symbol ~> Symbol) -> Type) (a6989586621681091188 :: Option a6989586621679060063) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ShowsPrec_6989586621681091190Sym1 a6989586621681091187 a6989586621679060063 :: TyFun (Option a6989586621679060063) (Symbol ~> Symbol) -> Type) (a6989586621681091188 :: Option a6989586621679060063) = ShowsPrec_6989586621681091190Sym2 a6989586621681091187 a6989586621681091188
type Apply (TFHelper_6989586621681109087Sym0 :: TyFun (Option a6989586621679962814) (Option b6989586621679962815 ~> Option b6989586621679962815) -> Type) (a6989586621681109085 :: Option a6989586621679962814) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (TFHelper_6989586621681109087Sym0 :: TyFun (Option a6989586621679962814) (Option b6989586621679962815 ~> Option b6989586621679962815) -> Type) (a6989586621681109085 :: Option a6989586621679962814) = TFHelper_6989586621681109087Sym1 a6989586621681109085 b6989586621679962815 :: TyFun (Option b6989586621679962815) (Option b6989586621679962815) -> Type
type Apply (TFHelper_6989586621681109122Sym0 :: TyFun (Option a6989586621679962832) ((a6989586621679962832 ~> Option b6989586621679962833) ~> Option b6989586621679962833) -> Type) (a6989586621681109120 :: Option a6989586621679962832) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (TFHelper_6989586621681109122Sym0 :: TyFun (Option a6989586621679962832) ((a6989586621679962832 ~> Option b6989586621679962833) ~> Option b6989586621679962833) -> Type) (a6989586621681109120 :: Option a6989586621679962832) = TFHelper_6989586621681109122Sym1 a6989586621681109120 b6989586621679962833 :: TyFun (a6989586621679962832 ~> Option b6989586621679962833) (Option b6989586621679962833) -> Type
type Apply (TFHelper_6989586621681109134Sym0 :: TyFun (Option a6989586621679962834) (Option b6989586621679962835 ~> Option b6989586621679962835) -> Type) (a6989586621681109132 :: Option a6989586621679962834) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (TFHelper_6989586621681109134Sym0 :: TyFun (Option a6989586621679962834) (Option b6989586621679962835 ~> Option b6989586621679962835) -> Type) (a6989586621681109132 :: Option a6989586621679962834) = TFHelper_6989586621681109134Sym1 a6989586621681109132 b6989586621679962835 :: TyFun (Option b6989586621679962835) (Option b6989586621679962835) -> Type
type Apply (TFHelper_6989586621681109058Sym0 :: TyFun (Option (a6989586621679962809 ~> b6989586621679962810)) (Option a6989586621679962809 ~> Option b6989586621679962810) -> Type) (a6989586621681109056 :: Option (a6989586621679962809 ~> b6989586621679962810)) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (TFHelper_6989586621681109058Sym0 :: TyFun (Option (a6989586621679962809 ~> b6989586621679962810)) (Option a6989586621679962809 ~> Option b6989586621679962810) -> Type) (a6989586621681109056 :: Option (a6989586621679962809 ~> b6989586621679962810)) = TFHelper_6989586621681109058Sym1 a6989586621681109056
type Apply (LiftA2_6989586621681109071Sym1 a6989586621681109068 :: TyFun (Option a6989586621679962811) (Option b6989586621679962812 ~> Option c6989586621679962813) -> Type) (a6989586621681109069 :: Option a6989586621679962811) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (LiftA2_6989586621681109071Sym1 a6989586621681109068 :: TyFun (Option a6989586621679962811) (Option b6989586621679962812 ~> Option c6989586621679962813) -> Type) (a6989586621681109069 :: Option a6989586621679962811) = LiftA2_6989586621681109071Sym2 a6989586621681109068 a6989586621681109069
type Apply (TFHelper_6989586621681109122Sym1 a6989586621681109120 b :: TyFun (a ~> Option b) (Option b) -> Type) (a6989586621681109121 :: a ~> Option b) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (TFHelper_6989586621681109122Sym1 a6989586621681109120 b :: TyFun (a ~> Option b) (Option b) -> Type) (a6989586621681109121 :: a ~> Option b) = TFHelper_6989586621681109122 a6989586621681109120 a6989586621681109121
type Apply (Fmap_6989586621681109098Sym0 :: TyFun (a6989586621679962803 ~> b6989586621679962804) (Option a6989586621679962803 ~> Option b6989586621679962804) -> Type) (a6989586621681109096 :: a6989586621679962803 ~> b6989586621679962804) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (Fmap_6989586621681109098Sym0 :: TyFun (a6989586621679962803 ~> b6989586621679962804) (Option a6989586621679962803 ~> Option b6989586621679962804) -> Type) (a6989586621681109096 :: a6989586621679962803 ~> b6989586621679962804) = Fmap_6989586621681109098Sym1 a6989586621681109096
type Apply (FoldMap_6989586621681109164Sym0 :: TyFun (a6989586621680742384 ~> m6989586621680742383) (Option a6989586621680742384 ~> m6989586621680742383) -> Type) (a6989586621681109162 :: a6989586621680742384 ~> m6989586621680742383) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (FoldMap_6989586621681109164Sym0 :: TyFun (a6989586621680742384 ~> m6989586621680742383) (Option a6989586621680742384 ~> m6989586621680742383) -> Type) (a6989586621681109162 :: a6989586621680742384 ~> m6989586621680742383) = FoldMap_6989586621681109164Sym1 a6989586621681109162
type Apply (LiftA2_6989586621681109071Sym0 :: TyFun (a6989586621679962811 ~> (b6989586621679962812 ~> c6989586621679962813)) (Option a6989586621679962811 ~> (Option b6989586621679962812 ~> Option c6989586621679962813)) -> Type) (a6989586621681109068 :: a6989586621679962811 ~> (b6989586621679962812 ~> c6989586621679962813)) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (LiftA2_6989586621681109071Sym0 :: TyFun (a6989586621679962811 ~> (b6989586621679962812 ~> c6989586621679962813)) (Option a6989586621679962811 ~> (Option b6989586621679962812 ~> Option c6989586621679962813)) -> Type) (a6989586621681109068 :: a6989586621679962811 ~> (b6989586621679962812 ~> c6989586621679962813)) = LiftA2_6989586621681109071Sym1 a6989586621681109068
type Apply (Traverse_6989586621681109176Sym0 :: TyFun (a6989586621680988964 ~> f6989586621680988963 b6989586621680988965) (Option a6989586621680988964 ~> f6989586621680988963 (Option b6989586621680988965)) -> Type) (a6989586621681109174 :: a6989586621680988964 ~> f6989586621680988963 b6989586621680988965) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (Traverse_6989586621681109176Sym0 :: TyFun (a6989586621680988964 ~> f6989586621680988963 b6989586621680988965) (Option a6989586621680988964 ~> f6989586621680988963 (Option b6989586621680988965)) -> Type) (a6989586621681109174 :: a6989586621680988964 ~> f6989586621680988963 b6989586621680988965) = Traverse_6989586621681109176Sym1 a6989586621681109174
type Apply (Option_Sym1 a6989586621681175302 a6989586621681175291 :: TyFun (a6989586621681175291 ~> b6989586621681175290) (Option a6989586621681175291 ~> b6989586621681175290) -> Type) (a6989586621681175303 :: a6989586621681175291 ~> b6989586621681175290) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (Option_Sym1 a6989586621681175302 a6989586621681175291 :: TyFun (a6989586621681175291 ~> b6989586621681175290) (Option a6989586621681175291 ~> b6989586621681175290) -> Type) (a6989586621681175303 :: a6989586621681175291 ~> b6989586621681175290) = Option_Sym2 a6989586621681175302 a6989586621681175303

sortWith :: Ord b => (a -> b) -> [a] -> [a] #

The sortWith function sorts a list of elements using the user supplied function to project something out of each element

class Bifunctor (p :: Type -> Type -> Type) where #

A bifunctor is a type constructor that takes two type arguments and is a functor in both arguments. That is, unlike with Functor, a type constructor such as Either does not need to be partially applied for a Bifunctor instance, and the methods in this class permit mapping functions over the Left value or the Right value, or both at the same time.

Formally, the class Bifunctor represents a bifunctor from Hask -> Hask.

Intuitively it is a bifunctor where both the first and second arguments are covariant.

You can define a Bifunctor by either defining bimap or by defining both first and second.

If you supply bimap, you should ensure that:

bimap id idid

If you supply first and second, ensure:

first idid
second idid

If you supply both, you should also ensure:

bimap f g ≡ first f . second g

These ensure by parametricity:

bimap  (f . g) (h . i) ≡ bimap f h . bimap g i
first  (f . g) ≡ first  f . first  g
second (f . g) ≡ second f . second g

Since: base-4.8.0.0

Minimal complete definition

bimap | first, second

Methods

bimap :: (a -> b) -> (c -> d) -> p a c -> p b d #

Map over both arguments at the same time.

bimap f g ≡ first f . second g

Examples

Expand
>>> bimap toUpper (+1) ('j', 3)
('J',4)
>>> bimap toUpper (+1) (Left 'j')
Left 'J'
>>> bimap toUpper (+1) (Right 3)
Right 4

first :: (a -> b) -> p a c -> p b c #

Map covariantly over the first argument.

first f ≡ bimap f id

Examples

Expand
>>> first toUpper ('j', 3)
('J',3)
>>> first toUpper (Left 'j')
Left 'J'

second :: (b -> c) -> p a b -> p a c #

Map covariantly over the second argument.

secondbimap id

Examples

Expand
>>> second (+1) ('j', 3)
('j',4)
>>> second (+1) (Right 3)
Right 4

Instances

Instances details
Bifunctor Either

Since: base-4.8.0.0

Instance details

Defined in Data.Bifunctor

Methods

bimap :: (a -> b) -> (c -> d) -> Either a c -> Either b d #

first :: (a -> b) -> Either a c -> Either b c #

second :: (b -> c) -> Either a b -> Either a c #

Bifunctor (,)

Since: base-4.8.0.0

Instance details

Defined in Data.Bifunctor

Methods

bimap :: (a -> b) -> (c -> d) -> (a, c) -> (b, d) #

first :: (a -> b) -> (a, c) -> (b, c) #

second :: (b -> c) -> (a, b) -> (a, c) #

Bifunctor Arg

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

bimap :: (a -> b) -> (c -> d) -> Arg a c -> Arg b d #

first :: (a -> b) -> Arg a c -> Arg b c #

second :: (b -> c) -> Arg a b -> Arg a c #

Bifunctor ((,,) x1)

Since: base-4.8.0.0

Instance details

Defined in Data.Bifunctor

Methods

bimap :: (a -> b) -> (c -> d) -> (x1, a, c) -> (x1, b, d) #

first :: (a -> b) -> (x1, a, c) -> (x1, b, c) #

second :: (b -> c) -> (x1, a, b) -> (x1, a, c) #

Bifunctor (Const :: Type -> Type -> Type)

Since: base-4.8.0.0

Instance details

Defined in Data.Bifunctor

Methods

bimap :: (a -> b) -> (c -> d) -> Const a c -> Const b d #

first :: (a -> b) -> Const a c -> Const b c #

second :: (b -> c) -> Const a b -> Const a c #

Functor f => Bifunctor (FreeF f) 
Instance details

Defined in Control.Monad.Trans.Free

Methods

bimap :: (a -> b) -> (c -> d) -> FreeF f a c -> FreeF f b d #

first :: (a -> b) -> FreeF f a c -> FreeF f b c #

second :: (b -> c) -> FreeF f a b -> FreeF f a c #

Functor f => Bifunctor (CofreeF f) 
Instance details

Defined in Control.Comonad.Trans.Cofree

Methods

bimap :: (a -> b) -> (c -> d) -> CofreeF f a c -> CofreeF f b d #

first :: (a -> b) -> CofreeF f a c -> CofreeF f b c #

second :: (b -> c) -> CofreeF f a b -> CofreeF f a 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 #

Bifunctor (K1 i :: Type -> Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Bifunctor

Methods

bimap :: (a -> b) -> (c -> d) -> K1 i a c -> K1 i b d #

first :: (a -> b) -> K1 i a c -> K1 i b c #

second :: (b -> c) -> K1 i a b -> K1 i a c #

Bifunctor ((,,,) x1 x2)

Since: base-4.8.0.0

Instance details

Defined in Data.Bifunctor

Methods

bimap :: (a -> b) -> (c -> d) -> (x1, x2, a, c) -> (x1, x2, b, d) #

first :: (a -> b) -> (x1, x2, a, c) -> (x1, x2, b, c) #

second :: (b -> c) -> (x1, x2, a, b) -> (x1, x2, a, c) #

Bifunctor ((,,,,) x1 x2 x3)

Since: base-4.8.0.0

Instance details

Defined in Data.Bifunctor

Methods

bimap :: (a -> b) -> (c -> d) -> (x1, x2, x3, a, c) -> (x1, x2, x3, b, d) #

first :: (a -> b) -> (x1, x2, x3, a, c) -> (x1, x2, x3, b, c) #

second :: (b -> c) -> (x1, x2, x3, a, b) -> (x1, x2, x3, a, c) #

Bifunctor p => Bifunctor (WrappedBifunctor p) 
Instance details

Defined in Data.Bifunctor.Wrapped

Methods

bimap :: (a -> b) -> (c -> d) -> WrappedBifunctor p a c -> WrappedBifunctor p b d #

first :: (a -> b) -> WrappedBifunctor p a c -> WrappedBifunctor p b c #

second :: (b -> c) -> WrappedBifunctor p a b -> WrappedBifunctor p a c #

Functor g => Bifunctor (Joker g :: Type -> Type -> Type) 
Instance details

Defined in Data.Bifunctor.Joker

Methods

bimap :: (a -> b) -> (c -> d) -> Joker g a c -> Joker g b d #

first :: (a -> b) -> Joker g a c -> Joker g b c #

second :: (b -> c) -> Joker g a b -> Joker g a c #

Bifunctor p => Bifunctor (Flip p) 
Instance details

Defined in Data.Bifunctor.Flip

Methods

bimap :: (a -> b) -> (c -> d) -> Flip p a c -> Flip p b d #

first :: (a -> b) -> Flip p a c -> Flip p b c #

second :: (b -> c) -> Flip p a b -> Flip p a c #

Functor f => Bifunctor (Clown f :: Type -> Type -> Type) 
Instance details

Defined in Data.Bifunctor.Clown

Methods

bimap :: (a -> b) -> (c -> d) -> Clown f a c -> Clown f b d #

first :: (a -> b) -> Clown f a c -> Clown f b c #

second :: (b -> c) -> Clown f a b -> Clown f a c #

Bifunctor ((,,,,,) x1 x2 x3 x4)

Since: base-4.8.0.0

Instance details

Defined in Data.Bifunctor

Methods

bimap :: (a -> b) -> (c -> d) -> (x1, x2, x3, x4, a, c) -> (x1, x2, x3, x4, b, d) #

first :: (a -> b) -> (x1, x2, x3, x4, a, c) -> (x1, x2, x3, x4, b, c) #

second :: (b -> c) -> (x1, x2, x3, x4, a, b) -> (x1, x2, x3, x4, a, c) #

(Bifunctor p, Bifunctor q) => Bifunctor (Sum p q) 
Instance details

Defined in Data.Bifunctor.Sum

Methods

bimap :: (a -> b) -> (c -> d) -> Sum p q a c -> Sum p q b d #

first :: (a -> b) -> Sum p q a c -> Sum p q b c #

second :: (b -> c) -> Sum p q a b -> Sum p q a c #

(Bifunctor f, Bifunctor g) => Bifunctor (Product f g) 
Instance details

Defined in Data.Bifunctor.Product

Methods

bimap :: (a -> b) -> (c -> d) -> Product f g a c -> Product f g b d #

first :: (a -> b) -> Product f g a c -> Product f g b c #

second :: (b -> c) -> Product f g a b -> Product f g a c #

Bifunctor ((,,,,,,) x1 x2 x3 x4 x5)

Since: base-4.8.0.0

Instance details

Defined in Data.Bifunctor

Methods

bimap :: (a -> b) -> (c -> d) -> (x1, x2, x3, x4, x5, a, c) -> (x1, x2, x3, x4, x5, b, d) #

first :: (a -> b) -> (x1, x2, x3, x4, x5, a, c) -> (x1, x2, x3, x4, x5, b, c) #

second :: (b -> c) -> (x1, x2, x3, x4, x5, a, b) -> (x1, x2, x3, x4, x5, a, c) #

(Functor f, Bifunctor p) => Bifunctor (Tannen f p) 
Instance details

Defined in Data.Bifunctor.Tannen

Methods

bimap :: (a -> b) -> (c -> d) -> Tannen f p a c -> Tannen f p b d #

first :: (a -> b) -> Tannen f p a c -> Tannen f p b c #

second :: (b -> c) -> Tannen f p a b -> Tannen f p a c #

(Bifunctor p, Functor f, Functor g) => Bifunctor (Biff p f g) 
Instance details

Defined in Data.Bifunctor.Biff

Methods

bimap :: (a -> b) -> (c -> d) -> Biff p f g a c -> Biff p f g b d #

first :: (a -> b) -> Biff p f g a c -> Biff p f g b c #

second :: (b -> c) -> Biff p f g a b -> Biff p f g a c #

init :: NonEmpty a -> [a] #

Extract everything except the last element of the stream.

last :: NonEmpty a -> a #

Extract the last element of the stream.

tail :: NonEmpty a -> [a] #

Extract the possibly-empty tail of the stream.

head :: NonEmpty a -> a #

Extract the first element of the stream.

nonEmpty :: [a] -> Maybe (NonEmpty a) #

nonEmpty efficiently turns a normal list into a NonEmpty stream, producing Nothing if the input is empty.

showStackTrace :: IO (Maybe String) #

Get a string representation of the current execution stack state.

getStackTrace :: IO (Maybe [Location]) #

Get a trace of the current execution stack state.

Returns Nothing if stack trace support isn't available on host machine.

class Monad m => MonadIO (m :: Type -> Type) where #

Monads in which IO computations may be embedded. Any monad built by applying a sequence of monad transformers to the IO monad will be an instance of this class.

Instances should satisfy the following laws, which state that liftIO is a transformer of monads:

Methods

liftIO :: IO a -> m a #

Lift a computation from the IO monad.

Instances

Instances details
MonadIO IO

Since: base-4.9.0.0

Instance details

Defined in Control.Monad.IO.Class

Methods

liftIO :: IO a -> IO a #

MonadIO Q 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

liftIO :: IO a -> Q a #

MonadIO m => MonadIO (MaybeT m) 
Instance details

Defined in Control.Monad.Trans.Maybe

Methods

liftIO :: IO a -> MaybeT m a #

MonadIO m => MonadIO (IdentityT m) 
Instance details

Defined in Control.Monad.Trans.Identity

Methods

liftIO :: IO a -> IdentityT m a #

MonadIO m => MonadIO (ExceptT e m) 
Instance details

Defined in Control.Monad.Trans.Except

Methods

liftIO :: IO a -> ExceptT e m a #

(Functor f, MonadIO m) => MonadIO (FreeT f m) 
Instance details

Defined in Control.Monad.Trans.Free

Methods

liftIO :: IO a -> FreeT f m a #

(Error e, MonadIO m) => MonadIO (ErrorT e m) 
Instance details

Defined in Control.Monad.Trans.Error

Methods

liftIO :: IO a -> ErrorT e m a #

MonadIO m => MonadIO (StateT s m) 
Instance details

Defined in Control.Monad.Trans.State.Strict

Methods

liftIO :: IO a -> StateT s m a #

MonadIO m => MonadIO (ReaderT r m) 
Instance details

Defined in Control.Monad.Trans.Reader

Methods

liftIO :: IO a -> ReaderT r m a #

mfilter :: MonadPlus m => (a -> Bool) -> m a -> m a #

Direct MonadPlus equivalent of filter.

Examples

Expand

The filter function is just mfilter specialized to the list monad:

filter = ( mfilter :: (a -> Bool) -> [a] -> [a] )

An example using mfilter with the Maybe monad:

>>> mfilter odd (Just 1)
Just 1
>>> mfilter odd (Just 2)
Nothing

(<$!>) :: Monad m => (a -> b) -> m a -> m b infixl 4 #

Strict version of <$>.

Since: base-4.8.0.0

replicateM_ :: Applicative m => Int -> m a -> m () #

Like replicateM, but discards the result.

replicateM :: Applicative m => Int -> m a -> m [a] #

replicateM n act performs the action n times, gathering the results.

foldM_ :: (Foldable t, Monad m) => (b -> a -> m b) -> b -> t a -> m () #

Like foldM, but discards the result.

foldM :: (Foldable t, Monad m) => (b -> a -> m b) -> b -> t a -> m b #

The foldM function is analogous to foldl, except that its result is encapsulated in a monad. Note that foldM works from left-to-right over the list arguments. This could be an issue where (>>) and the `folded function' are not commutative.

foldM f a1 [x1, x2, ..., xm]

==

do
  a2 <- f a1 x1
  a3 <- f a2 x2
  ...
  f am xm

If right-to-left evaluation is required, the input list should be reversed.

Note: foldM is the same as foldlM

zipWithM_ :: Applicative m => (a -> b -> m c) -> [a] -> [b] -> m () #

zipWithM_ is the extension of zipWithM which ignores the final result.

zipWithM :: Applicative m => (a -> b -> m c) -> [a] -> [b] -> m [c] #

The zipWithM function generalizes zipWith to arbitrary applicative functors.

mapAndUnzipM :: Applicative m => (a -> m (b, c)) -> [a] -> m ([b], [c]) #

The mapAndUnzipM function maps its first argument over a list, returning the result as a pair of lists. This function is mainly used with complicated data structures or a state monad.

forever :: Applicative f => f a -> f b #

Repeat an action indefinitely.

Examples

Expand

A common use of forever is to process input from network sockets, Handles, and channels (e.g. MVar and Chan).

For example, here is how we might implement an echo server, using forever both to listen for client connections on a network socket and to echo client input on client connection handles:

echoServer :: Socket -> IO ()
echoServer socket = forever $ do
  client <- accept socket
  forkFinally (echo client) (\_ -> hClose client)
  where
    echo :: Handle -> IO ()
    echo client = forever $
      hGetLine client >>= hPutStrLn client

(<=<) :: Monad m => (b -> m c) -> (a -> m b) -> a -> m c infixr 1 #

Right-to-left composition of Kleisli arrows. (>=>), with the arguments flipped.

Note how this operator resembles function composition (.):

(.)   ::            (b ->   c) -> (a ->   b) -> a ->   c
(<=<) :: Monad m => (b -> m c) -> (a -> m b) -> a -> m c

(>=>) :: Monad m => (a -> m b) -> (b -> m c) -> a -> m c infixr 1 #

Left-to-right composition of Kleisli arrows.

filterM :: Applicative m => (a -> m Bool) -> [a] -> m [a] #

This generalizes the list-based filter function.

foldMapDefault :: (Traversable t, Monoid m) => (a -> m) -> t a -> m #

This function may be used as a value for foldMap in a Foldable instance.

foldMapDefault f ≡ getConst . traverse (Const . f)

fmapDefault :: Traversable t => (a -> b) -> t a -> t b #

This function may be used as a value for fmap in a Functor instance, provided that traverse is defined. (Using fmapDefault with a Traversable instance defined only by sequenceA will result in infinite recursion.)

fmapDefault f ≡ runIdentity . traverse (Identity . f)

mapAccumR :: Traversable t => (a -> b -> (a, c)) -> a -> t b -> (a, t c) #

The mapAccumR function behaves like a combination of fmap and foldr; it applies a function to each element of a structure, passing an accumulating parameter from right to left, and returning a final value of this accumulator together with the new structure.

mapAccumL :: Traversable t => (a -> b -> (a, c)) -> a -> t b -> (a, t c) #

The mapAccumL function behaves like a combination of fmap and foldl; it applies a function to each element of a structure, passing an accumulating parameter from left to right, and returning a final value of this accumulator together with the new structure.

forM :: (Traversable t, Monad m) => t a -> (a -> m b) -> m (t b) #

forM is mapM with its arguments flipped. For a version that ignores the results see forM_.

optional :: Alternative f => f a -> f (Maybe a) #

One or none.

newtype ZipList a #

Lists, but with an Applicative functor based on zipping.

Constructors

ZipList 

Fields

Instances

Instances details
Functor ZipList

Since: base-2.1

Instance details

Defined in Control.Applicative

Methods

fmap :: (a -> b) -> ZipList a -> ZipList b #

(<$) :: a -> ZipList b -> ZipList a #

Applicative ZipList
f <$> ZipList xs1 <*> ... <*> ZipList xsN
    = ZipList (zipWithN f xs1 ... xsN)

where zipWithN refers to the zipWith function of the appropriate arity (zipWith, zipWith3, zipWith4, ...). For example:

(\a b c -> stimes c [a, b]) <$> ZipList "abcd" <*> ZipList "567" <*> ZipList [1..]
    = ZipList (zipWith3 (\a b c -> stimes c [a, b]) "abcd" "567" [1..])
    = ZipList {getZipList = ["a5","b6b6","c7c7c7"]}

Since: base-2.1

Instance details

Defined in Control.Applicative

Methods

pure :: a -> ZipList a #

(<*>) :: ZipList (a -> b) -> ZipList a -> ZipList b #

liftA2 :: (a -> b -> c) -> ZipList a -> ZipList b -> ZipList c #

(*>) :: ZipList a -> ZipList b -> ZipList b #

(<*) :: ZipList a -> ZipList b -> ZipList a #

Foldable ZipList

Since: base-4.9.0.0

Instance details

Defined in Control.Applicative

Methods

fold :: Monoid m => ZipList m -> m #

foldMap :: Monoid m => (a -> m) -> ZipList a -> m #

foldMap' :: Monoid m => (a -> m) -> ZipList a -> m #

foldr :: (a -> b -> b) -> b -> ZipList a -> b #

foldr' :: (a -> b -> b) -> b -> ZipList a -> b #

foldl :: (b -> a -> b) -> b -> ZipList a -> b #

foldl' :: (b -> a -> b) -> b -> ZipList a -> b #

foldr1 :: (a -> a -> a) -> ZipList a -> a #

foldl1 :: (a -> a -> a) -> ZipList a -> a #

toList :: ZipList a -> [a] #

null :: ZipList a -> Bool #

length :: ZipList a -> Int #

elem :: Eq a => a -> ZipList a -> Bool #

maximum :: Ord a => ZipList a -> a #

minimum :: Ord a => ZipList a -> a #

sum :: Num a => ZipList a -> a #

product :: Num a => ZipList a -> a #

Traversable ZipList

Since: base-4.9.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> ZipList a -> f (ZipList b) #

sequenceA :: Applicative f => ZipList (f a) -> f (ZipList a) #

mapM :: Monad m => (a -> m b) -> ZipList a -> m (ZipList b) #

sequence :: Monad m => ZipList (m a) -> m (ZipList a) #

Alternative ZipList

Since: base-4.11.0.0

Instance details

Defined in Control.Applicative

Methods

empty :: ZipList a #

(<|>) :: ZipList a -> ZipList a -> ZipList a #

some :: ZipList a -> ZipList [a] #

many :: ZipList a -> ZipList [a] #

NFData1 ZipList

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

liftRnf :: (a -> ()) -> ZipList a -> () #

Eq a => Eq (ZipList a)

Since: base-4.7.0.0

Instance details

Defined in Control.Applicative

Methods

(==) :: ZipList a -> ZipList a -> Bool #

(/=) :: ZipList a -> ZipList a -> Bool #

Ord a => Ord (ZipList a)

Since: base-4.7.0.0

Instance details

Defined in Control.Applicative

Methods

compare :: ZipList a -> ZipList a -> Ordering #

(<) :: ZipList a -> ZipList a -> Bool #

(<=) :: ZipList a -> ZipList a -> Bool #

(>) :: ZipList a -> ZipList a -> Bool #

(>=) :: ZipList a -> ZipList a -> Bool #

max :: ZipList a -> ZipList a -> ZipList a #

min :: ZipList a -> ZipList a -> ZipList a #

Read a => Read (ZipList a)

Since: base-4.7.0.0

Instance details

Defined in Control.Applicative

Show a => Show (ZipList a)

Since: base-4.7.0.0

Instance details

Defined in Control.Applicative

Methods

showsPrec :: Int -> ZipList a -> ShowS #

show :: ZipList a -> String #

showList :: [ZipList a] -> ShowS #

Generic (ZipList a)

Since: base-4.7.0.0

Instance details

Defined in Control.Applicative

Associated Types

type Rep (ZipList a) :: Type -> Type #

Methods

from :: ZipList a -> Rep (ZipList a) x #

to :: Rep (ZipList a) x -> ZipList a #

NFData a => NFData (ZipList a)

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: ZipList a -> () #

Wrapped (ZipList a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (ZipList a) #

Methods

_Wrapped' :: Iso' (ZipList a) (Unwrapped (ZipList a)) #

Container (ZipList a) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element (ZipList a) #

Methods

toList :: ZipList a -> [Element (ZipList a)] #

null :: ZipList a -> Bool #

foldr :: (Element (ZipList a) -> b -> b) -> b -> ZipList a -> b #

foldl :: (b -> Element (ZipList a) -> b) -> b -> ZipList a -> b #

foldl' :: (b -> Element (ZipList a) -> b) -> b -> ZipList a -> b #

length :: ZipList a -> Int #

elem :: Element (ZipList a) -> ZipList a -> Bool #

maximum :: ZipList a -> Element (ZipList a) #

minimum :: ZipList a -> Element (ZipList a) #

foldMap :: Monoid m => (Element (ZipList a) -> m) -> ZipList a -> m #

fold :: ZipList a -> Element (ZipList a) #

foldr' :: (Element (ZipList a) -> b -> b) -> b -> ZipList a -> b #

foldr1 :: (Element (ZipList a) -> Element (ZipList a) -> Element (ZipList a)) -> ZipList a -> Element (ZipList a) #

foldl1 :: (Element (ZipList a) -> Element (ZipList a) -> Element (ZipList a)) -> ZipList a -> Element (ZipList a) #

notElem :: Element (ZipList a) -> ZipList a -> Bool #

all :: (Element (ZipList a) -> Bool) -> ZipList a -> Bool #

any :: (Element (ZipList a) -> Bool) -> ZipList a -> Bool #

and :: ZipList a -> Bool #

or :: ZipList a -> Bool #

find :: (Element (ZipList a) -> Bool) -> ZipList a -> Maybe (Element (ZipList a)) #

safeHead :: ZipList a -> Maybe (Element (ZipList a)) #

Generic1 ZipList

Since: base-4.7.0.0

Instance details

Defined in Control.Applicative

Associated Types

type Rep1 ZipList :: k -> Type #

Methods

from1 :: forall (a :: k). ZipList a -> Rep1 ZipList a #

to1 :: forall (a :: k). Rep1 ZipList a -> ZipList a #

t ~ ZipList b => Rewrapped (ZipList a) t 
Instance details

Defined in Control.Lens.Wrapped

type Rep (ZipList a) 
Instance details

Defined in Control.Applicative

type Rep (ZipList a) = D1 ('MetaData "ZipList" "Control.Applicative" "base" 'True) (C1 ('MetaCons "ZipList" 'PrefixI 'True) (S1 ('MetaSel ('Just "getZipList") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [a])))
type Item (ZipList a) 
Instance details

Defined in Data.Orphans

type Item (ZipList a) = a
type Unwrapped (ZipList a) 
Instance details

Defined in Control.Lens.Wrapped

type Unwrapped (ZipList a) = [a]
type Element (ZipList a) 
Instance details

Defined in Universum.Container.Class

type Element (ZipList a) = ElementDefault (ZipList a)
type Rep1 ZipList 
Instance details

Defined in Control.Applicative

type Rep1 ZipList = D1 ('MetaData "ZipList" "Control.Applicative" "base" 'True) (C1 ('MetaCons "ZipList" 'PrefixI 'True) (S1 ('MetaSel ('Just "getZipList") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 [])))

(&&&) :: Arrow a => a b c -> a b c' -> a b (c, c') infixr 3 #

Fanout: send the input to both argument arrows and combine their output.

The default definition may be overridden with a more efficient version if desired.

newtype Identity a #

Identity functor and monad. (a non-strict monad)

Since: base-4.8.0.0

Constructors

Identity 

Fields

Instances

Instances details
Monad Identity

Since: base-4.8.0.0

Instance details

Defined in Data.Functor.Identity

Methods

(>>=) :: Identity a -> (a -> Identity b) -> Identity b #

(>>) :: Identity a -> Identity b -> Identity b #

return :: a -> Identity a #

Functor Identity

Since: base-4.8.0.0

Instance details

Defined in Data.Functor.Identity

Methods

fmap :: (a -> b) -> Identity a -> Identity b #

(<$) :: a -> Identity b -> Identity a #

MonadFix Identity

Since: base-4.8.0.0

Instance details

Defined in Data.Functor.Identity

Methods

mfix :: (a -> Identity a) -> Identity a #

Applicative Identity

Since: base-4.8.0.0

Instance details

Defined in Data.Functor.Identity

Methods

pure :: a -> Identity a #

(<*>) :: Identity (a -> b) -> Identity a -> Identity b #

liftA2 :: (a -> b -> c) -> Identity a -> Identity b -> Identity c #

(*>) :: Identity a -> Identity b -> Identity b #

(<*) :: Identity a -> Identity b -> Identity a #

Foldable Identity

Since: base-4.8.0.0

Instance details

Defined in Data.Functor.Identity

Methods

fold :: Monoid m => Identity m -> m #

foldMap :: Monoid m => (a -> m) -> Identity a -> m #

foldMap' :: Monoid m => (a -> m) -> Identity a -> m #

foldr :: (a -> b -> b) -> b -> Identity a -> b #

foldr' :: (a -> b -> b) -> b -> Identity a -> b #

foldl :: (b -> a -> b) -> b -> Identity a -> b #

foldl' :: (b -> a -> b) -> b -> Identity a -> b #

foldr1 :: (a -> a -> a) -> Identity a -> a #

foldl1 :: (a -> a -> a) -> Identity a -> a #

toList :: Identity a -> [a] #

null :: Identity a -> Bool #

length :: Identity a -> Int #

elem :: Eq a => a -> Identity a -> Bool #

maximum :: Ord a => Identity a -> a #

minimum :: Ord a => Identity a -> a #

sum :: Num a => Identity a -> a #

product :: Num a => Identity a -> a #

Traversable Identity

Since: base-4.9.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> Identity a -> f (Identity b) #

sequenceA :: Applicative f => Identity (f a) -> f (Identity a) #

mapM :: Monad m => (a -> m b) -> Identity a -> m (Identity b) #

sequence :: Monad m => Identity (m a) -> m (Identity a) #

Representable Identity 
Instance details

Defined in Data.Functor.Rep

Associated Types

type Rep Identity #

Methods

tabulate :: (Rep Identity -> a) -> Identity a #

index :: Identity a -> Rep Identity -> a #

NFData1 Identity

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

liftRnf :: (a -> ()) -> Identity a -> () #

Hashable1 Identity 
Instance details

Defined in Data.Hashable.Class

Methods

liftHashWithSalt :: (Int -> a -> Int) -> Int -> Identity a -> Int #

KnownNamedFunctor Identity 
Instance details

Defined in Util.Named

Methods

namedL :: forall (name :: Symbol) a. Label name -> Iso' (NamedF Identity a name) (ApplyNamedFunctor Identity a) #

InjValue Identity 
Instance details

Defined in Named.Internal

Methods

injValue :: a -> Identity a #

PTraversable Identity 
Instance details

Defined in Data.Singletons.Prelude.Traversable

Associated Types

type Traverse arg0 arg1 :: f0 (t0 b0) #

type SequenceA arg0 :: f0 (t0 a0) #

type MapM arg0 arg1 :: m0 (t0 b0) #

type Sequence arg0 :: m0 (t0 a0) #

STraversable Identity 
Instance details

Defined in Data.Singletons.Prelude.Traversable

Methods

sTraverse :: forall a (f :: Type -> Type) b (t1 :: a ~> f b) (t2 :: Identity a). SApplicative f => Sing t1 -> Sing t2 -> Sing (Apply (Apply TraverseSym0 t1) t2) #

sSequenceA :: forall (f :: Type -> Type) a (t :: Identity (f a)). SApplicative f => Sing t -> Sing (Apply SequenceASym0 t) #

sMapM :: forall a (m :: Type -> Type) b (t1 :: a ~> m b) (t2 :: Identity a). SMonad m => Sing t1 -> Sing t2 -> Sing (Apply (Apply MapMSym0 t1) t2) #

sSequence :: forall (m :: Type -> Type) a (t :: Identity (m a)). SMonad m => Sing t -> Sing (Apply SequenceSym0 t) #

Sieve ReifiedGetter Identity 
Instance details

Defined in Control.Lens.Reified

Methods

sieve :: ReifiedGetter a b -> a -> Identity b #

Cosieve ReifiedGetter Identity 
Instance details

Defined in Control.Lens.Reified

Methods

cosieve :: ReifiedGetter a b -> Identity a -> b #

() :=> (Monad Identity) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Monad Identity #

() :=> (Functor Identity) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Functor Identity #

Unbox a => Vector Vector (Identity a) 
Instance details

Defined in Data.Vector.Unboxed.Base

Unbox a => MVector MVector (Identity a) 
Instance details

Defined in Data.Vector.Unboxed.Base

Bounded a => Bounded (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

Enum a => Enum (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

Eq a => Eq (Identity a)

Since: base-4.8.0.0

Instance details

Defined in Data.Functor.Identity

Methods

(==) :: Identity a -> Identity a -> Bool #

(/=) :: Identity a -> Identity a -> Bool #

Floating a => Floating (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

Fractional a => Fractional (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

Integral a => Integral (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

Data a => Data (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Identity a -> c (Identity a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Identity a) #

toConstr :: Identity a -> Constr #

dataTypeOf :: Identity a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Identity a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Identity a)) #

gmapT :: (forall b. Data b => b -> b) -> Identity a -> Identity a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Identity a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Identity a -> r #

gmapQ :: (forall d. Data d => d -> u) -> Identity a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Identity a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Identity a -> m (Identity a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Identity a -> m (Identity a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Identity a -> m (Identity a) #

Num a => Num (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

Ord a => Ord (Identity a)

Since: base-4.8.0.0

Instance details

Defined in Data.Functor.Identity

Methods

compare :: Identity a -> Identity a -> Ordering #

(<) :: Identity a -> Identity a -> Bool #

(<=) :: Identity a -> Identity a -> Bool #

(>) :: Identity a -> Identity a -> Bool #

(>=) :: Identity a -> Identity a -> Bool #

max :: Identity a -> Identity a -> Identity a #

min :: Identity a -> Identity a -> Identity a #

Read a => Read (Identity a)

This instance would be equivalent to the derived instances of the Identity newtype if the runIdentity field were removed

Since: base-4.8.0.0

Instance details

Defined in Data.Functor.Identity

Real a => Real (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

Methods

toRational :: Identity a -> Rational #

RealFloat a => RealFloat (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

RealFrac a => RealFrac (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

Methods

properFraction :: Integral b => Identity a -> (b, Identity a) #

truncate :: Integral b => Identity a -> b #

round :: Integral b => Identity a -> b #

ceiling :: Integral b => Identity a -> b #

floor :: Integral b => Identity a -> b #

Show a => Show (Identity a)

This instance would be equivalent to the derived instances of the Identity newtype if the runIdentity field were removed

Since: base-4.8.0.0

Instance details

Defined in Data.Functor.Identity

Methods

showsPrec :: Int -> Identity a -> ShowS #

show :: Identity a -> String #

showList :: [Identity a] -> ShowS #

Ix a => Ix (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

IsString a => IsString (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.String

Methods

fromString :: String -> Identity a #

Generic (Identity a)

Since: base-4.8.0.0

Instance details

Defined in Data.Functor.Identity

Associated Types

type Rep (Identity a) :: Type -> Type #

Methods

from :: Identity a -> Rep (Identity a) x #

to :: Rep (Identity a) x -> Identity a #

Semigroup a => Semigroup (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

Methods

(<>) :: Identity a -> Identity a -> Identity a #

sconcat :: NonEmpty (Identity a) -> Identity a #

stimes :: Integral b => b -> Identity a -> Identity 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 #

Hashable a => Hashable (Identity a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Identity a -> Int #

hash :: Identity a -> Int #

Storable a => Storable (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

Methods

sizeOf :: Identity a -> Int #

alignment :: Identity a -> Int #

peekElemOff :: Ptr (Identity a) -> Int -> IO (Identity a) #

pokeElemOff :: Ptr (Identity a) -> Int -> Identity a -> IO () #

peekByteOff :: Ptr b -> Int -> IO (Identity a) #

pokeByteOff :: Ptr b -> Int -> Identity a -> IO () #

peek :: Ptr (Identity a) -> IO (Identity a) #

poke :: Ptr (Identity a) -> Identity a -> IO () #

Bits a => Bits (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

FiniteBits a => FiniteBits (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

NFData a => NFData (Identity a)

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Identity a -> () #

Unbox a => Unbox (Identity a) 
Instance details

Defined in Data.Vector.Unboxed.Base

Ixed (Identity a) 
Instance details

Defined in Control.Lens.At

Methods

ix :: Index (Identity a) -> Traversal' (Identity a) (IxValue (Identity a)) #

Wrapped (Identity a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (Identity a) #

IsoValue a => IsoValue (Identity a) 
Instance details

Defined in Michelson.Typed.Haskell.Value

Associated Types

type ToT (Identity a) :: T #

Methods

toVal :: Identity a -> Value (ToT (Identity a)) #

fromVal :: Value (ToT (Identity a)) -> Identity a #

(TypeError (DisallowInstance "Identity") :: Constraint) => Container (Identity a) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element (Identity a) #

Methods

toList :: Identity a -> [Element (Identity a)] #

null :: Identity a -> Bool #

foldr :: (Element (Identity a) -> b -> b) -> b -> Identity a -> b #

foldl :: (b -> Element (Identity a) -> b) -> b -> Identity a -> b #

foldl' :: (b -> Element (Identity a) -> b) -> b -> Identity a -> b #

length :: Identity a -> Int #

elem :: Element (Identity a) -> Identity a -> Bool #

maximum :: Identity a -> Element (Identity a) #

minimum :: Identity a -> Element (Identity a) #

foldMap :: Monoid m => (Element (Identity a) -> m) -> Identity a -> m #

fold :: Identity a -> Element (Identity a) #

foldr' :: (Element (Identity a) -> b -> b) -> b -> Identity a -> b #

foldr1 :: (Element (Identity a) -> Element (Identity a) -> Element (Identity a)) -> Identity a -> Element (Identity a) #

foldl1 :: (Element (Identity a) -> Element (Identity a) -> Element (Identity a)) -> Identity a -> Element (Identity a) #

notElem :: Element (Identity a) -> Identity a -> Bool #

all :: (Element (Identity a) -> Bool) -> Identity a -> Bool #

any :: (Element (Identity a) -> Bool) -> Identity a -> Bool #

and :: Identity a -> Bool #

or :: Identity a -> Bool #

find :: (Element (Identity a) -> Bool) -> Identity a -> Maybe (Element (Identity a)) #

safeHead :: Identity a -> Maybe (Element (Identity a)) #

PIsString (Identity a) 
Instance details

Defined in Data.Singletons.Prelude.IsString

Associated Types

type FromString arg0 :: a0 #

SIsString a => SIsString (Identity a) 
Instance details

Defined in Data.Singletons.Prelude.IsString

Methods

sFromString :: forall (t :: Symbol). Sing t -> Sing (Apply FromStringSym0 t) #

PBounded (Identity a) 
Instance details

Defined in Data.Singletons.Prelude.Enum

Associated Types

type MinBound :: a0 #

type MaxBound :: a0 #

SBounded a => SBounded (Identity a) 
Instance details

Defined in Data.Singletons.Prelude.Enum

POrd (Identity a) 
Instance details

Defined in Data.Singletons.Prelude.Ord

Associated Types

type Compare arg0 arg1 :: Ordering #

type arg0 < arg1 :: Bool #

type arg0 <= arg1 :: Bool #

type arg0 > arg1 :: Bool #

type arg0 >= arg1 :: Bool #

type Max arg0 arg1 :: a0 #

type Min arg0 arg1 :: a0 #

SOrd a => SOrd (Identity a) 
Instance details

Defined in Data.Singletons.Prelude.Ord

Methods

sCompare :: forall (t1 :: Identity a) (t2 :: Identity a). Sing t1 -> Sing t2 -> Sing (Apply (Apply CompareSym0 t1) t2) #

(%<) :: forall (t1 :: Identity a) (t2 :: Identity a). Sing t1 -> Sing t2 -> Sing (Apply (Apply (<@#@$) t1) t2) #

(%<=) :: forall (t1 :: Identity a) (t2 :: Identity a). Sing t1 -> Sing t2 -> Sing (Apply (Apply (<=@#@$) t1) t2) #

(%>) :: forall (t1 :: Identity a) (t2 :: Identity a). Sing t1 -> Sing t2 -> Sing (Apply (Apply (>@#@$) t1) t2) #

(%>=) :: forall (t1 :: Identity a) (t2 :: Identity a). Sing t1 -> Sing t2 -> Sing (Apply (Apply (>=@#@$) t1) t2) #

sMax :: forall (t1 :: Identity a) (t2 :: Identity a). Sing t1 -> Sing t2 -> Sing (Apply (Apply MaxSym0 t1) t2) #

sMin :: forall (t1 :: Identity a) (t2 :: Identity a). Sing t1 -> Sing t2 -> Sing (Apply (Apply MinSym0 t1) t2) #

SEq a => SEq (Identity a) 
Instance details

Defined in Data.Singletons.Prelude.Eq

Methods

(%==) :: forall (a0 :: Identity a) (b :: Identity a). Sing a0 -> Sing b -> Sing (a0 == b) #

(%/=) :: forall (a0 :: Identity a) (b :: Identity a). Sing a0 -> Sing b -> Sing (a0 /= b) #

PEq (Identity a) 
Instance details

Defined in Data.Singletons.Prelude.Eq

Associated Types

type x == y :: Bool #

type x /= y :: Bool #

Generic1 Identity

Since: base-4.8.0.0

Instance details

Defined in Data.Functor.Identity

Associated Types

type Rep1 Identity :: k -> Type #

Methods

from1 :: forall (a :: k). Identity a -> Rep1 Identity a #

to1 :: forall (a :: k). Rep1 Identity a -> Identity a #

t ~ Identity b => Rewrapped (Identity a) t 
Instance details

Defined in Control.Lens.Wrapped

SDecide a => TestCoercion (SIdentity :: Identity a -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Instances

Methods

testCoercion :: forall (a0 :: k) (b :: k). SIdentity a0 -> SIdentity b -> Maybe (Coercion a0 b) #

SDecide a => TestEquality (SIdentity :: Identity a -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Instances

Methods

testEquality :: forall (a0 :: k) (b :: k). SIdentity a0 -> SIdentity b -> Maybe (a0 :~: b) #

(Bounded a) :=> (Bounded (Identity a)) 
Instance details

Defined in Data.Constraint

Methods

ins :: Bounded a :- Bounded (Identity a) #

(Enum a) :=> (Enum (Identity a)) 
Instance details

Defined in Data.Constraint

Methods

ins :: Enum a :- Enum (Identity a) #

(Eq a) :=> (Eq (Identity a)) 
Instance details

Defined in Data.Constraint

Methods

ins :: Eq a :- Eq (Identity a) #

(Floating a) :=> (Floating (Identity a)) 
Instance details

Defined in Data.Constraint

Methods

ins :: Floating a :- Floating (Identity a) #

(Fractional a) :=> (Fractional (Identity a)) 
Instance details

Defined in Data.Constraint

(Integral a) :=> (Integral (Identity a)) 
Instance details

Defined in Data.Constraint

Methods

ins :: Integral a :- Integral (Identity a) #

(Num a) :=> (Num (Identity a)) 
Instance details

Defined in Data.Constraint

Methods

ins :: Num a :- Num (Identity a) #

(Ord a) :=> (Ord (Identity a)) 
Instance details

Defined in Data.Constraint

Methods

ins :: Ord a :- Ord (Identity a) #

(Read a) :=> (Read (Identity a)) 
Instance details

Defined in Data.Constraint

Methods

ins :: Read a :- Read (Identity a) #

(Real a) :=> (Real (Identity a)) 
Instance details

Defined in Data.Constraint

Methods

ins :: Real a :- Real (Identity a) #

(RealFloat a) :=> (RealFloat (Identity a)) 
Instance details

Defined in Data.Constraint

(RealFrac a) :=> (RealFrac (Identity a)) 
Instance details

Defined in Data.Constraint

Methods

ins :: RealFrac a :- RealFrac (Identity a) #

(Show a) :=> (Show (Identity a)) 
Instance details

Defined in Data.Constraint

Methods

ins :: Show a :- Show (Identity a) #

(Semigroup a) :=> (Semigroup (Identity a)) 
Instance details

Defined in Data.Constraint

(Monoid a) :=> (Monoid (Identity a)) 
Instance details

Defined in Data.Constraint

Methods

ins :: Monoid a :- Monoid (Identity a) #

(Bits a) :=> (Bits (Identity a)) 
Instance details

Defined in Data.Constraint

Methods

ins :: Bits a :- Bits (Identity a) #

Field1 (Identity a) (Identity b) a b 
Instance details

Defined in Control.Lens.Tuple

Methods

_1 :: Lens (Identity a) (Identity b) a b #

SingI (IdentitySym0 :: TyFun a (Identity a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Instances

SuppressUnusedWarnings (ToEnum_6989586621680921033Sym0 :: TyFun Nat (Identity a6989586621680920912) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Identity

SuppressUnusedWarnings (FromInteger_6989586621680921135Sym0 :: TyFun Nat (Identity a6989586621680920923) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Identity

SuppressUnusedWarnings (ShowsPrec_6989586621680921156Sym0 :: TyFun Nat (Identity a6989586621680920937 ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Identity

SuppressUnusedWarnings (FromString_6989586621681391379Sym0 :: TyFun Symbol (Identity a6989586621681391348) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.IsString

SuppressUnusedWarnings (IdentitySym0 :: TyFun a6989586621679087410 (Identity a6989586621679087410) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Instances

SuppressUnusedWarnings (Pure_6989586621680921371Sym0 :: TyFun a6989586621679962808 (Identity a6989586621679962808) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Identity

SuppressUnusedWarnings (Elem_6989586621680921217Sym0 :: TyFun a6989586621680742398 (Identity a6989586621680742398 ~> Bool) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Identity

SuppressUnusedWarnings (RunIdentitySym0 :: TyFun (Identity a6989586621679087410) a6989586621679087410 -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Instances

SuppressUnusedWarnings (Compare_6989586621679803706Sym0 :: TyFun (Identity a6989586621679087410) (Identity a6989586621679087410 ~> Ordering) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

SuppressUnusedWarnings (ToList_6989586621680921364Sym0 :: TyFun (Identity a6989586621680742395) [a6989586621680742395] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Identity

SuppressUnusedWarnings (TFHelper_6989586621680921143Sym0 :: TyFun (Identity a6989586621680920934) (Identity a6989586621680920934 ~> Identity a6989586621680920934) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Identity

SuppressUnusedWarnings (TFHelper_6989586621680921103Sym0 :: TyFun (Identity a6989586621680920923) (Identity a6989586621680920923 ~> Identity a6989586621680920923) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Identity

SuppressUnusedWarnings (TFHelper_6989586621680921091Sym0 :: TyFun (Identity a6989586621680920923) (Identity a6989586621680920923 ~> Identity a6989586621680920923) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Identity

SuppressUnusedWarnings (TFHelper_6989586621680921079Sym0 :: TyFun (Identity a6989586621680920923) (Identity a6989586621680920923 ~> Identity a6989586621680920923) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Identity

SuppressUnusedWarnings (Sum_6989586621680921357Sym0 :: TyFun (Identity a6989586621680742401) a6989586621680742401 -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Identity

SuppressUnusedWarnings (Succ_6989586621680921019Sym0 :: TyFun (Identity a6989586621680920912) (Identity a6989586621680920912) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Identity

SuppressUnusedWarnings (Signum_6989586621680921128Sym0 :: TyFun (Identity a6989586621680920923) (Identity a6989586621680920923) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Identity

SuppressUnusedWarnings (Product_6989586621680921350Sym0 :: TyFun (Identity a6989586621680742402) a6989586621680742402 -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Identity

SuppressUnusedWarnings (Pred_6989586621680921026Sym0 :: TyFun (Identity a6989586621680920912) (Identity a6989586621680920912) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Identity

SuppressUnusedWarnings (Null_6989586621680921344Sym0 :: TyFun (Identity a6989586621680742396) Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Identity

SuppressUnusedWarnings (Negate_6989586621680921114Sym0 :: TyFun (Identity a6989586621680920923) (Identity a6989586621680920923) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Identity

SuppressUnusedWarnings (Minimum_6989586621680921337Sym0 :: TyFun (Identity a6989586621680742400) a6989586621680742400 -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Identity

SuppressUnusedWarnings (Maximum_6989586621680921330Sym0 :: TyFun (Identity a6989586621680742399) a6989586621680742399 -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Identity

SuppressUnusedWarnings (Length_6989586621680921324Sym0 :: TyFun (Identity a6989586621680742397) Nat -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Identity

SuppressUnusedWarnings (FromEnum_6989586621680921040Sym0 :: TyFun (Identity a6989586621680920912) Nat -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Identity

SuppressUnusedWarnings (EnumFromTo_6989586621680921048Sym0 :: TyFun (Identity a6989586621680920912) (Identity a6989586621680920912 ~> [Identity a6989586621680920912]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Identity

SuppressUnusedWarnings (EnumFromThenTo_6989586621680921061Sym0 :: TyFun (Identity a6989586621680920912) (Identity a6989586621680920912 ~> (Identity a6989586621680920912 ~> [Identity a6989586621680920912])) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Identity

SuppressUnusedWarnings (Abs_6989586621680921121Sym0 :: TyFun (Identity a6989586621680920923) (Identity a6989586621680920923) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Identity

SuppressUnusedWarnings (Foldr1_6989586621680921314Sym0 :: TyFun (a6989586621680742393 ~> (a6989586621680742393 ~> a6989586621680742393)) (Identity a6989586621680742393 ~> a6989586621680742393) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Identity

SuppressUnusedWarnings (Foldl1_6989586621680921263Sym0 :: TyFun (a6989586621680742394 ~> (a6989586621680742394 ~> a6989586621680742394)) (Identity a6989586621680742394 ~> a6989586621680742394) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Identity

SuppressUnusedWarnings (TFHelper_6989586621680921186Sym0 :: TyFun a6989586621679962805 (Identity b6989586621679962806 ~> Identity a6989586621679962805) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Identity

SuppressUnusedWarnings (Compare_6989586621679803706Sym1 a6989586621679803704 :: TyFun (Identity a6989586621679087410) Ordering -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

SuppressUnusedWarnings (TFHelper_6989586621680921410Sym0 :: TyFun (Identity a6989586621679962832) ((a6989586621679962832 ~> Identity b6989586621679962833) ~> Identity b6989586621679962833) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Identity

SuppressUnusedWarnings (TFHelper_6989586621680921143Sym1 a6989586621680921141 :: TyFun (Identity a6989586621680920934) (Identity a6989586621680920934) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Identity

SuppressUnusedWarnings (TFHelper_6989586621680921103Sym1 a6989586621680921101 :: TyFun (Identity a6989586621680920923) (Identity a6989586621680920923) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Identity

SuppressUnusedWarnings (TFHelper_6989586621680921091Sym1 a6989586621680921089 :: TyFun (Identity a6989586621680920923) (Identity a6989586621680920923) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Identity

SuppressUnusedWarnings (TFHelper_6989586621680921079Sym1 a6989586621680921077 :: TyFun (Identity a6989586621680920923) (Identity a6989586621680920923) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Identity

SuppressUnusedWarnings (ShowsPrec_6989586621680921156Sym1 a6989586621680921153 a6989586621680920937 :: TyFun (Identity a6989586621680920937) (Symbol ~> Symbol) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Identity

SuppressUnusedWarnings (Foldr1_6989586621680921314Sym1 a6989586621680921312 :: TyFun (Identity a6989586621680742393) a6989586621680742393 -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Identity

SuppressUnusedWarnings (Foldl1_6989586621680921263Sym1 a6989586621680921261 :: TyFun (Identity a6989586621680742394) a6989586621680742394 -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Identity

SuppressUnusedWarnings (EnumFromTo_6989586621680921048Sym1 a6989586621680921046 :: TyFun (Identity a6989586621680920912) [Identity a6989586621680920912] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Identity

SuppressUnusedWarnings (EnumFromThenTo_6989586621680921061Sym1 a6989586621680921058 :: TyFun (Identity a6989586621680920912) (Identity a6989586621680920912 ~> [Identity a6989586621680920912]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Identity

SuppressUnusedWarnings (Elem_6989586621680921217Sym1 a6989586621680921215 :: TyFun (Identity a6989586621680742398) Bool -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Identity

SuppressUnusedWarnings (TFHelper_6989586621680921381Sym0 :: TyFun (Identity (a6989586621679962809 ~> b6989586621679962810)) (Identity a6989586621679962809 ~> Identity b6989586621679962810) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Identity

SuppressUnusedWarnings (Foldr_6989586621680921275Sym0 :: TyFun (a6989586621680742385 ~> (b6989586621680742386 ~> b6989586621680742386)) (b6989586621680742386 ~> (Identity a6989586621680742385 ~> b6989586621680742386)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Identity

SuppressUnusedWarnings (Foldr'_6989586621680921292Sym0 :: TyFun (a6989586621680742387 ~> (b6989586621680742388 ~> b6989586621680742388)) (b6989586621680742388 ~> (Identity a6989586621680742387 ~> b6989586621680742388)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Identity

SuppressUnusedWarnings (Foldl_6989586621680921230Sym0 :: TyFun (b6989586621680742389 ~> (a6989586621680742390 ~> b6989586621680742389)) (b6989586621680742389 ~> (Identity a6989586621680742390 ~> b6989586621680742389)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Identity

SuppressUnusedWarnings (Foldl'_6989586621680921247Sym0 :: TyFun (b6989586621680742391 ~> (a6989586621680742392 ~> b6989586621680742391)) (b6989586621680742391 ~> (Identity a6989586621680742392 ~> b6989586621680742391)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Identity

SuppressUnusedWarnings (FoldMap_6989586621680921205Sym0 :: TyFun (a6989586621680742384 ~> m6989586621680742383) (Identity a6989586621680742384 ~> m6989586621680742383) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Identity

SuppressUnusedWarnings (Fmap_6989586621680921174Sym0 :: TyFun (a6989586621679962803 ~> b6989586621679962804) (Identity a6989586621679962803 ~> Identity b6989586621679962804) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Identity

SuppressUnusedWarnings (Foldr_6989586621680921275Sym1 a6989586621680921272 :: TyFun b6989586621680742386 (Identity a6989586621680742385 ~> b6989586621680742386) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Identity

SuppressUnusedWarnings (Foldr'_6989586621680921292Sym1 a6989586621680921289 :: TyFun b6989586621680742388 (Identity a6989586621680742387 ~> b6989586621680742388) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Identity

SuppressUnusedWarnings (Foldl_6989586621680921230Sym1 a6989586621680921227 :: TyFun b6989586621680742389 (Identity a6989586621680742390 ~> b6989586621680742389) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Identity

SuppressUnusedWarnings (Foldl'_6989586621680921247Sym1 a6989586621680921244 :: TyFun b6989586621680742391 (Identity a6989586621680742392 ~> b6989586621680742391) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Identity

SuppressUnusedWarnings (TFHelper_6989586621680921381Sym1 a6989586621680921379 :: TyFun (Identity a6989586621679962809) (Identity b6989586621679962810) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Identity

SuppressUnusedWarnings (TFHelper_6989586621680921186Sym1 a6989586621680921184 b6989586621679962806 :: TyFun (Identity b6989586621679962806) (Identity a6989586621679962805) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Identity

SuppressUnusedWarnings (FoldMap_6989586621680921205Sym1 a6989586621680921203 :: TyFun (Identity a6989586621680742384) m6989586621680742383 -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Identity

SuppressUnusedWarnings (Fmap_6989586621680921174Sym1 a6989586621680921172 :: TyFun (Identity a6989586621679962803) (Identity b6989586621679962804) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Identity

SuppressUnusedWarnings (EnumFromThenTo_6989586621680921061Sym2 a6989586621680921059 a6989586621680921058 :: TyFun (Identity a6989586621680920912) [Identity a6989586621680920912] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Identity

SuppressUnusedWarnings (Traverse_6989586621680995197Sym0 :: TyFun (a6989586621680988964 ~> f6989586621680988963 b6989586621680988965) (Identity a6989586621680988964 ~> f6989586621680988963 (Identity b6989586621680988965)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

SuppressUnusedWarnings (Let6989586621680994995Scrutinee_6989586621680994595Sym0 :: TyFun (a6989586621680988964 ~> b6989586621680988965) (TyFun (t6989586621680988962 a6989586621680988964) (Identity (t6989586621680988962 b6989586621680988965)) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

SuppressUnusedWarnings (TFHelper_6989586621680921410Sym1 a6989586621680921408 b6989586621679962833 :: TyFun (a6989586621679962832 ~> Identity b6989586621679962833) (Identity b6989586621679962833) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Identity

SuppressUnusedWarnings (LiftA2_6989586621680921394Sym0 :: TyFun (a6989586621679962811 ~> (b6989586621679962812 ~> c6989586621679962813)) (Identity a6989586621679962811 ~> (Identity b6989586621679962812 ~> Identity c6989586621679962813)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Identity

SuppressUnusedWarnings (Let6989586621680994995Scrutinee_6989586621680994595Sym1 f6989586621680994993 :: TyFun (t6989586621680988962 a6989586621680988964) (Identity (t6989586621680988962 b6989586621680988965)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

SuppressUnusedWarnings (Traverse_6989586621680995197Sym1 a6989586621680995195 :: TyFun (Identity a6989586621680988964) (f6989586621680988963 (Identity b6989586621680988965)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

SuppressUnusedWarnings (LiftA2_6989586621680921394Sym1 a6989586621680921391 :: TyFun (Identity a6989586621679962811) (Identity b6989586621679962812 ~> Identity c6989586621679962813) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Identity

SuppressUnusedWarnings (Foldr_6989586621680921275Sym2 a6989586621680921273 a6989586621680921272 :: TyFun (Identity a6989586621680742385) b6989586621680742386 -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Identity

SuppressUnusedWarnings (Foldr'_6989586621680921292Sym2 a6989586621680921290 a6989586621680921289 :: TyFun (Identity a6989586621680742387) b6989586621680742388 -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Identity

SuppressUnusedWarnings (Foldl_6989586621680921230Sym2 a6989586621680921228 a6989586621680921227 :: TyFun (Identity a6989586621680742390) b6989586621680742389 -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Identity

SuppressUnusedWarnings (Foldl'_6989586621680921247Sym2 a6989586621680921245 a6989586621680921244 :: TyFun (Identity a6989586621680742392) b6989586621680742391 -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Identity

SuppressUnusedWarnings (LiftA2_6989586621680921394Sym2 a6989586621680921392 a6989586621680921391 :: TyFun (Identity b6989586621679962812) (Identity c6989586621679962813) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Identity

Wrappable (NamedF Identity a name) 
Instance details

Defined in Lorentz.Wrappable

Associated Types

type Unwrappable (NamedF Identity a name) #

(HasAnnotation a, KnownSymbol name) => HasAnnotation (NamedF Identity a name) 
Instance details

Defined in Lorentz.Annotation

Methods

getAnnotation :: Notes (ToT (NamedF Identity a name)) #

IsoValue a => IsoValue (NamedF Identity a name) 
Instance details

Defined in Michelson.Typed.Haskell.Value

Associated Types

type ToT (NamedF Identity a name) :: T #

Methods

toVal :: NamedF Identity a name -> Value (ToT (NamedF Identity a name)) #

fromVal :: Value (ToT (NamedF Identity a name)) -> NamedF Identity a name #

type Rep Identity 
Instance details

Defined in Data.Functor.Rep

type Rep Identity = ()
type Product (a :: Identity k2) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type Product (a :: Identity k2) = Apply (Product_6989586621680921350Sym0 :: TyFun (Identity k2) k2 -> Type) a
type Sum (a :: Identity k2) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type Sum (a :: Identity k2) = Apply (Sum_6989586621680921357Sym0 :: TyFun (Identity k2) k2 -> Type) a
type Minimum (a :: Identity k2) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type Minimum (a :: Identity k2) = Apply (Minimum_6989586621680921337Sym0 :: TyFun (Identity k2) k2 -> Type) a
type Maximum (a :: Identity k2) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type Maximum (a :: Identity k2) = Apply (Maximum_6989586621680921330Sym0 :: TyFun (Identity k2) k2 -> Type) a
type Length (a :: Identity a6989586621680742397) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type Length (a :: Identity a6989586621680742397) = Apply (Length_6989586621680921324Sym0 :: TyFun (Identity a6989586621680742397) Nat -> Type) a
type Null (a :: Identity a6989586621680742396) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type Null (a :: Identity a6989586621680742396) = Apply (Null_6989586621680921344Sym0 :: TyFun (Identity a6989586621680742396) Bool -> Type) a
type ToList (a :: Identity a6989586621680742395) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type ToList (a :: Identity a6989586621680742395) = Apply (ToList_6989586621680921364Sym0 :: TyFun (Identity a6989586621680742395) [a6989586621680742395] -> Type) a
type Fold (arg0 :: Identity m0) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type Fold (arg0 :: Identity m0) = Apply (Fold_6989586621680743057Sym0 :: TyFun (Identity m0) m0 -> Type) arg0
type Pure (a :: k1) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type Pure (a :: k1) = Apply (Pure_6989586621680921371Sym0 :: TyFun k1 (Identity k1) -> Type) a
type Return (arg0 :: a0) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type Return (arg0 :: a0) = Apply (Return_6989586621679963334Sym0 :: TyFun a0 (Identity a0) -> Type) arg0
type Sequence (arg0 :: Identity (m0 a0)) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type Sequence (arg0 :: Identity (m0 a0)) = Apply (Sequence_6989586621680989026Sym0 :: TyFun (Identity (m0 a0)) (m0 (Identity a0)) -> Type) arg0
type SequenceA (arg0 :: Identity (f0 a0)) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type SequenceA (arg0 :: Identity (f0 a0)) = Apply (SequenceA_6989586621680989001Sym0 :: TyFun (Identity (f0 a0)) (f0 (Identity a0)) -> Type) arg0
type Elem (a1 :: k1) (a2 :: Identity k1) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type Elem (a1 :: k1) (a2 :: Identity k1) = Apply (Apply (Elem_6989586621680921217Sym0 :: TyFun k1 (Identity k1 ~> Bool) -> Type) a1) a2
type Foldl1 (a1 :: k2 ~> (k2 ~> k2)) (a2 :: Identity k2) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type Foldl1 (a1 :: k2 ~> (k2 ~> k2)) (a2 :: Identity k2) = Apply (Apply (Foldl1_6989586621680921263Sym0 :: TyFun (k2 ~> (k2 ~> k2)) (Identity k2 ~> k2) -> Type) a1) a2
type Foldr1 (a1 :: k2 ~> (k2 ~> k2)) (a2 :: Identity k2) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type Foldr1 (a1 :: k2 ~> (k2 ~> k2)) (a2 :: Identity k2) = Apply (Apply (Foldr1_6989586621680921314Sym0 :: TyFun (k2 ~> (k2 ~> k2)) (Identity k2 ~> k2) -> Type) a1) a2
type FoldMap (a1 :: a6989586621680742384 ~> k2) (a2 :: Identity a6989586621680742384) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type FoldMap (a1 :: a6989586621680742384 ~> k2) (a2 :: Identity a6989586621680742384) = Apply (Apply (FoldMap_6989586621680921205Sym0 :: TyFun (a6989586621680742384 ~> k2) (Identity a6989586621680742384 ~> k2) -> Type) a1) a2
type (a1 :: k1) <$ (a2 :: Identity b6989586621679962806) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type (a1 :: k1) <$ (a2 :: Identity b6989586621679962806) = Apply (Apply (TFHelper_6989586621680921186Sym0 :: TyFun k1 (Identity b6989586621679962806 ~> Identity k1) -> Type) a1) a2
type Fmap (a1 :: a6989586621679962803 ~> b6989586621679962804) (a2 :: Identity a6989586621679962803) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type Fmap (a1 :: a6989586621679962803 ~> b6989586621679962804) (a2 :: Identity a6989586621679962803) = Apply (Apply (Fmap_6989586621680921174Sym0 :: TyFun (a6989586621679962803 ~> b6989586621679962804) (Identity a6989586621679962803 ~> Identity b6989586621679962804) -> Type) a1) a2
type (arg1 :: Identity a0) <* (arg2 :: Identity b0) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type (arg1 :: Identity a0) <* (arg2 :: Identity b0) = Apply (Apply (TFHelper_6989586621679963287Sym0 :: TyFun (Identity a0) (Identity b0 ~> Identity a0) -> Type) arg1) arg2
type (arg1 :: Identity a0) *> (arg2 :: Identity b0) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type (arg1 :: Identity a0) *> (arg2 :: Identity b0) = Apply (Apply (TFHelper_6989586621679963275Sym0 :: TyFun (Identity a0) (Identity b0 ~> Identity b0) -> Type) arg1) arg2
type (a1 :: Identity (a6989586621679962809 ~> b6989586621679962810)) <*> (a2 :: Identity a6989586621679962809) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type (a1 :: Identity (a6989586621679962809 ~> b6989586621679962810)) <*> (a2 :: Identity a6989586621679962809) = Apply (Apply (TFHelper_6989586621680921381Sym0 :: TyFun (Identity (a6989586621679962809 ~> b6989586621679962810)) (Identity a6989586621679962809 ~> Identity b6989586621679962810) -> Type) a1) a2
type (arg1 :: Identity a0) >> (arg2 :: Identity b0) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type (arg1 :: Identity a0) >> (arg2 :: Identity b0) = Apply (Apply (TFHelper_6989586621679963313Sym0 :: TyFun (Identity a0) (Identity b0 ~> Identity b0) -> Type) arg1) arg2
type (a1 :: Identity a6989586621679962832) >>= (a2 :: a6989586621679962832 ~> Identity b6989586621679962833) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type (a1 :: Identity a6989586621679962832) >>= (a2 :: a6989586621679962832 ~> Identity b6989586621679962833) = Apply (Apply (TFHelper_6989586621680921410Sym0 :: TyFun (Identity a6989586621679962832) ((a6989586621679962832 ~> Identity b6989586621679962833) ~> Identity b6989586621679962833) -> Type) a1) a2
type MapM (arg1 :: a0 ~> m0 b0) (arg2 :: Identity a0) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type MapM (arg1 :: a0 ~> m0 b0) (arg2 :: Identity a0) = Apply (Apply (MapM_6989586621680989011Sym0 :: TyFun (a0 ~> m0 b0) (Identity a0 ~> m0 (Identity b0)) -> Type) arg1) arg2
type Traverse (a1 :: a6989586621680988964 ~> f6989586621680988963 b6989586621680988965) (a2 :: Identity a6989586621680988964) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type Traverse (a1 :: a6989586621680988964 ~> f6989586621680988963 b6989586621680988965) (a2 :: Identity a6989586621680988964) = Apply (Apply (Traverse_6989586621680995197Sym0 :: TyFun (a6989586621680988964 ~> f6989586621680988963 b6989586621680988965) (Identity a6989586621680988964 ~> f6989586621680988963 (Identity b6989586621680988965)) -> Type) a1) a2
type Foldl' (a1 :: k2 ~> (a6989586621680742392 ~> k2)) (a2 :: k2) (a3 :: Identity a6989586621680742392) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type Foldl' (a1 :: k2 ~> (a6989586621680742392 ~> k2)) (a2 :: k2) (a3 :: Identity a6989586621680742392) = Apply (Apply (Apply (Foldl'_6989586621680921247Sym0 :: TyFun (k2 ~> (a6989586621680742392 ~> k2)) (k2 ~> (Identity a6989586621680742392 ~> k2)) -> Type) a1) a2) a3
type Foldl (a1 :: k2 ~> (a6989586621680742390 ~> k2)) (a2 :: k2) (a3 :: Identity a6989586621680742390) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type Foldl (a1 :: k2 ~> (a6989586621680742390 ~> k2)) (a2 :: k2) (a3 :: Identity a6989586621680742390) = Apply (Apply (Apply (Foldl_6989586621680921230Sym0 :: TyFun (k2 ~> (a6989586621680742390 ~> k2)) (k2 ~> (Identity a6989586621680742390 ~> k2)) -> Type) a1) a2) a3
type Foldr' (a1 :: a6989586621680742387 ~> (k2 ~> k2)) (a2 :: k2) (a3 :: Identity a6989586621680742387) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type Foldr' (a1 :: a6989586621680742387 ~> (k2 ~> k2)) (a2 :: k2) (a3 :: Identity a6989586621680742387) = Apply (Apply (Apply (Foldr'_6989586621680921292Sym0 :: TyFun (a6989586621680742387 ~> (k2 ~> k2)) (k2 ~> (Identity a6989586621680742387 ~> k2)) -> Type) a1) a2) a3
type Foldr (a1 :: a6989586621680742385 ~> (k2 ~> k2)) (a2 :: k2) (a3 :: Identity a6989586621680742385) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type Foldr (a1 :: a6989586621680742385 ~> (k2 ~> k2)) (a2 :: k2) (a3 :: Identity a6989586621680742385) = Apply (Apply (Apply (Foldr_6989586621680921275Sym0 :: TyFun (a6989586621680742385 ~> (k2 ~> k2)) (k2 ~> (Identity a6989586621680742385 ~> k2)) -> Type) a1) a2) a3
type LiftA2 (a1 :: a6989586621679962811 ~> (b6989586621679962812 ~> c6989586621679962813)) (a2 :: Identity a6989586621679962811) (a3 :: Identity b6989586621679962812) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type LiftA2 (a1 :: a6989586621679962811 ~> (b6989586621679962812 ~> c6989586621679962813)) (a2 :: Identity a6989586621679962811) (a3 :: Identity b6989586621679962812) = Apply (Apply (Apply (LiftA2_6989586621680921394Sym0 :: TyFun (a6989586621679962811 ~> (b6989586621679962812 ~> c6989586621679962813)) (Identity a6989586621679962811 ~> (Identity b6989586621679962812 ~> Identity c6989586621679962813)) -> Type) a1) a2) a3
newtype MVector s (Identity a) 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype MVector s (Identity a) = MV_Identity (MVector s a)
type Apply (ToEnum_6989586621680921033Sym0 :: TyFun Nat (Identity a6989586621680920912) -> Type) (a6989586621680921032 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type Apply (ToEnum_6989586621680921033Sym0 :: TyFun Nat (Identity a6989586621680920912) -> Type) (a6989586621680921032 :: Nat) = ToEnum_6989586621680921033 a6989586621680921032 :: Identity a6989586621680920912
type Apply (FromInteger_6989586621680921135Sym0 :: TyFun Nat (Identity a6989586621680920923) -> Type) (a6989586621680921134 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type Apply (FromInteger_6989586621680921135Sym0 :: TyFun Nat (Identity a6989586621680920923) -> Type) (a6989586621680921134 :: Nat) = FromInteger_6989586621680921135 a6989586621680921134 :: Identity a6989586621680920923
type Apply (FromString_6989586621681391379Sym0 :: TyFun Symbol (Identity a6989586621681391348) -> Type) (a6989586621681391378 :: Symbol) 
Instance details

Defined in Data.Singletons.Prelude.IsString

type Apply (FromString_6989586621681391379Sym0 :: TyFun Symbol (Identity a6989586621681391348) -> Type) (a6989586621681391378 :: Symbol) = FromString_6989586621681391379 a6989586621681391378 :: Identity a6989586621681391348
type Apply (IdentitySym0 :: TyFun a (Identity a) -> Type) (t6989586621679707550 :: a) 
Instance details

Defined in Data.Singletons.Prelude.Instances

type Apply (IdentitySym0 :: TyFun a (Identity a) -> Type) (t6989586621679707550 :: a) = 'Identity t6989586621679707550
type Apply (Pure_6989586621680921371Sym0 :: TyFun a (Identity a) -> Type) (a6989586621680921370 :: a) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type Apply (Pure_6989586621680921371Sym0 :: TyFun a (Identity a) -> Type) (a6989586621680921370 :: a) = Pure_6989586621680921371 a6989586621680921370
type Apply (ShowsPrec_6989586621680921156Sym0 :: TyFun Nat (Identity a6989586621680920937 ~> (Symbol ~> Symbol)) -> Type) (a6989586621680921153 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type Apply (ShowsPrec_6989586621680921156Sym0 :: TyFun Nat (Identity a6989586621680920937 ~> (Symbol ~> Symbol)) -> Type) (a6989586621680921153 :: Nat) = ShowsPrec_6989586621680921156Sym1 a6989586621680921153 a6989586621680920937 :: TyFun (Identity a6989586621680920937) (Symbol ~> Symbol) -> Type
type Apply (Elem_6989586621680921217Sym0 :: TyFun a6989586621680742398 (Identity a6989586621680742398 ~> Bool) -> Type) (a6989586621680921215 :: a6989586621680742398) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type Apply (Elem_6989586621680921217Sym0 :: TyFun a6989586621680742398 (Identity a6989586621680742398 ~> Bool) -> Type) (a6989586621680921215 :: a6989586621680742398) = Elem_6989586621680921217Sym1 a6989586621680921215
type Apply (TFHelper_6989586621680921186Sym0 :: TyFun a6989586621679962805 (Identity b6989586621679962806 ~> Identity a6989586621679962805) -> Type) (a6989586621680921184 :: a6989586621679962805) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type Apply (TFHelper_6989586621680921186Sym0 :: TyFun a6989586621679962805 (Identity b6989586621679962806 ~> Identity a6989586621679962805) -> Type) (a6989586621680921184 :: a6989586621679962805) = TFHelper_6989586621680921186Sym1 a6989586621680921184 b6989586621679962806 :: TyFun (Identity b6989586621679962806) (Identity a6989586621679962805) -> Type
type Apply (Foldl_6989586621680921230Sym1 a6989586621680921227 :: TyFun b6989586621680742389 (Identity a6989586621680742390 ~> b6989586621680742389) -> Type) (a6989586621680921228 :: b6989586621680742389) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type Apply (Foldl_6989586621680921230Sym1 a6989586621680921227 :: TyFun b6989586621680742389 (Identity a6989586621680742390 ~> b6989586621680742389) -> Type) (a6989586621680921228 :: b6989586621680742389) = Foldl_6989586621680921230Sym2 a6989586621680921227 a6989586621680921228
type Apply (Foldl'_6989586621680921247Sym1 a6989586621680921244 :: TyFun b6989586621680742391 (Identity a6989586621680742392 ~> b6989586621680742391) -> Type) (a6989586621680921245 :: b6989586621680742391) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type Apply (Foldl'_6989586621680921247Sym1 a6989586621680921244 :: TyFun b6989586621680742391 (Identity a6989586621680742392 ~> b6989586621680742391) -> Type) (a6989586621680921245 :: b6989586621680742391) = Foldl'_6989586621680921247Sym2 a6989586621680921244 a6989586621680921245
type Apply (Foldr_6989586621680921275Sym1 a6989586621680921272 :: TyFun b6989586621680742386 (Identity a6989586621680742385 ~> b6989586621680742386) -> Type) (a6989586621680921273 :: b6989586621680742386) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type Apply (Foldr_6989586621680921275Sym1 a6989586621680921272 :: TyFun b6989586621680742386 (Identity a6989586621680742385 ~> b6989586621680742386) -> Type) (a6989586621680921273 :: b6989586621680742386) = Foldr_6989586621680921275Sym2 a6989586621680921272 a6989586621680921273
type Apply (Foldr'_6989586621680921292Sym1 a6989586621680921289 :: TyFun b6989586621680742388 (Identity a6989586621680742387 ~> b6989586621680742388) -> Type) (a6989586621680921290 :: b6989586621680742388) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type Apply (Foldr'_6989586621680921292Sym1 a6989586621680921289 :: TyFun b6989586621680742388 (Identity a6989586621680742387 ~> b6989586621680742388) -> Type) (a6989586621680921290 :: b6989586621680742388) = Foldr'_6989586621680921292Sym2 a6989586621680921289 a6989586621680921290
type Rep (Identity a) 
Instance details

Defined in Data.Functor.Identity

type Rep (Identity a) = D1 ('MetaData "Identity" "Data.Functor.Identity" "base" 'True) (C1 ('MetaCons "Identity" 'PrefixI 'True) (S1 ('MetaSel ('Just "runIdentity") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a)))
newtype Vector (Identity a) 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype Vector (Identity a) = V_Identity (Vector a)
type Index (Identity a) 
Instance details

Defined in Control.Lens.At

type Index (Identity a) = ()
type IxValue (Identity a) 
Instance details

Defined in Control.Lens.At

type IxValue (Identity a) = a
type Unwrapped (Identity a) 
Instance details

Defined in Control.Lens.Wrapped

type Unwrapped (Identity a) = a
type ToT (Identity a) 
Instance details

Defined in Michelson.Typed.Haskell.Value

type ToT (Identity a) = ToT a
type Sing 
Instance details

Defined in Data.Singletons.Prelude.Instances

type Sing = SIdentity :: Identity a -> Type
type Element (Identity a) 
Instance details

Defined in Universum.Container.Class

type Element (Identity a) = ElementDefault (Identity a)
type Mempty 
Instance details

Defined in Data.Singletons.Prelude.Identity

type Mempty = Mempty_6989586621680921075Sym0 :: Identity a
type MaxBound 
Instance details

Defined in Data.Singletons.Prelude.Enum

type MaxBound = MaxBound_6989586621680125210Sym0 :: Identity a
type MinBound 
Instance details

Defined in Data.Singletons.Prelude.Enum

type MinBound = MinBound_6989586621680125208Sym0 :: Identity a
type Demote (Identity a) 
Instance details

Defined in Data.Singletons.Prelude.Instances

type Rep1 Identity 
Instance details

Defined in Data.Functor.Identity

type Rep1 Identity = D1 ('MetaData "Identity" "Data.Functor.Identity" "base" 'True) (C1 ('MetaCons "Identity" 'PrefixI 'True) (S1 ('MetaSel ('Just "runIdentity") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1))
type FromString a2 
Instance details

Defined in Data.Singletons.Prelude.IsString

type FromString a2 = Apply (FromString_6989586621681391379Sym0 :: TyFun Symbol (Identity a1) -> Type) a2
type Mconcat (arg0 :: [Identity a]) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type Mconcat (arg0 :: [Identity a]) = Apply (Mconcat_6989586621680631303Sym0 :: TyFun [Identity a] (Identity a) -> Type) arg0
type Show_ (arg0 :: Identity a) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type Show_ (arg0 :: Identity a) = Apply (Show__6989586621680577846Sym0 :: TyFun (Identity a) Symbol -> Type) arg0
type Sconcat (arg0 :: NonEmpty (Identity a)) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type Sconcat (arg0 :: NonEmpty (Identity a)) = Apply (Sconcat_6989586621680187691Sym0 :: TyFun (NonEmpty (Identity a)) (Identity a) -> Type) arg0
type FromEnum (a2 :: Identity a1) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type FromEnum (a2 :: Identity a1) = Apply (FromEnum_6989586621680921040Sym0 :: TyFun (Identity a1) Nat -> Type) a2
type ToEnum a2 
Instance details

Defined in Data.Singletons.Prelude.Identity

type ToEnum a2 = Apply (ToEnum_6989586621680921033Sym0 :: TyFun Nat (Identity a1) -> Type) a2
type Pred (a2 :: Identity a1) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type Pred (a2 :: Identity a1) = Apply (Pred_6989586621680921026Sym0 :: TyFun (Identity a1) (Identity a1) -> Type) a2
type Succ (a2 :: Identity a1) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type Succ (a2 :: Identity a1) = Apply (Succ_6989586621680921019Sym0 :: TyFun (Identity a1) (Identity a1) -> Type) a2
type FromInteger a2 
Instance details

Defined in Data.Singletons.Prelude.Identity

type FromInteger a2 = Apply (FromInteger_6989586621680921135Sym0 :: TyFun Nat (Identity a1) -> Type) a2
type Signum (a2 :: Identity a1) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type Signum (a2 :: Identity a1) = Apply (Signum_6989586621680921128Sym0 :: TyFun (Identity a1) (Identity a1) -> Type) a2
type Abs (a2 :: Identity a1) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type Abs (a2 :: Identity a1) = Apply (Abs_6989586621680921121Sym0 :: TyFun (Identity a1) (Identity a1) -> Type) a2
type Negate (a2 :: Identity a1) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type Negate (a2 :: Identity a1) = Apply (Negate_6989586621680921114Sym0 :: TyFun (Identity a1) (Identity a1) -> Type) a2
type Mappend (arg1 :: Identity a) (arg2 :: Identity a) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type Mappend (arg1 :: Identity a) (arg2 :: Identity a) = Apply (Apply (Mappend_6989586621680631288Sym0 :: TyFun (Identity a) (Identity a ~> Identity a) -> Type) arg1) arg2
type ShowList (arg1 :: [Identity a]) arg2 
Instance details

Defined in Data.Singletons.Prelude.Identity

type ShowList (arg1 :: [Identity a]) arg2 = Apply (Apply (ShowList_6989586621680577854Sym0 :: TyFun [Identity a] (Symbol ~> Symbol) -> Type) arg1) arg2
type (a2 :: Identity a1) <> (a3 :: Identity a1) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type (a2 :: Identity a1) <> (a3 :: Identity a1) = Apply (Apply (TFHelper_6989586621680921143Sym0 :: TyFun (Identity a1) (Identity a1 ~> Identity a1) -> Type) a2) a3
type EnumFromTo (a2 :: Identity a1) (a3 :: Identity a1) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type EnumFromTo (a2 :: Identity a1) (a3 :: Identity a1) = Apply (Apply (EnumFromTo_6989586621680921048Sym0 :: TyFun (Identity a1) (Identity a1 ~> [Identity a1]) -> Type) a2) a3
type (a2 :: Identity a1) * (a3 :: Identity a1) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type (a2 :: Identity a1) * (a3 :: Identity a1) = Apply (Apply (TFHelper_6989586621680921103Sym0 :: TyFun (Identity a1) (Identity a1 ~> Identity a1) -> Type) a2) a3
type (a2 :: Identity a1) - (a3 :: Identity a1) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type (a2 :: Identity a1) - (a3 :: Identity a1) = Apply (Apply (TFHelper_6989586621680921091Sym0 :: TyFun (Identity a1) (Identity a1 ~> Identity a1) -> Type) a2) a3
type (a2 :: Identity a1) + (a3 :: Identity a1) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type (a2 :: Identity a1) + (a3 :: Identity a1) = Apply (Apply (TFHelper_6989586621680921079Sym0 :: TyFun (Identity a1) (Identity a1 ~> Identity a1) -> Type) a2) a3
type Min (arg1 :: Identity a) (arg2 :: Identity a) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Min (arg1 :: Identity a) (arg2 :: Identity a) = Apply (Apply (Min_6989586621679792614Sym0 :: TyFun (Identity a) (Identity a ~> Identity a) -> Type) arg1) arg2
type Max (arg1 :: Identity a) (arg2 :: Identity a) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Max (arg1 :: Identity a) (arg2 :: Identity a) = Apply (Apply (Max_6989586621679792596Sym0 :: TyFun (Identity a) (Identity a ~> Identity a) -> Type) arg1) arg2
type (arg1 :: Identity a) >= (arg2 :: Identity a) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type (arg1 :: Identity a) >= (arg2 :: Identity a) = Apply (Apply (TFHelper_6989586621679792578Sym0 :: TyFun (Identity a) (Identity a ~> Bool) -> Type) arg1) arg2
type (arg1 :: Identity a) > (arg2 :: Identity a) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type (arg1 :: Identity a) > (arg2 :: Identity a) = Apply (Apply (TFHelper_6989586621679792560Sym0 :: TyFun (Identity a) (Identity a ~> Bool) -> Type) arg1) arg2
type (arg1 :: Identity a) <= (arg2 :: Identity a) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type (arg1 :: Identity a) <= (arg2 :: Identity a) = Apply (Apply (TFHelper_6989586621679792542Sym0 :: TyFun (Identity a) (Identity a ~> Bool) -> Type) arg1) arg2
type (arg1 :: Identity a) < (arg2 :: Identity a) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type (arg1 :: Identity a) < (arg2 :: Identity a) = Apply (Apply (TFHelper_6989586621679792524Sym0 :: TyFun (Identity a) (Identity a ~> Bool) -> Type) arg1) arg2
type Compare (a2 :: Identity a1) (a3 :: Identity a1) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Compare (a2 :: Identity a1) (a3 :: Identity a1) = Apply (Apply (Compare_6989586621679803706Sym0 :: TyFun (Identity a1) (Identity a1 ~> Ordering) -> Type) a2) a3
type (x :: Identity a) /= (y :: Identity a) 
Instance details

Defined in Data.Singletons.Prelude.Eq

type (x :: Identity a) /= (y :: Identity a) = Not (x == y)
type (a2 :: Identity a1) == (b :: Identity a1) 
Instance details

Defined in Data.Singletons.Prelude.Eq

type (a2 :: Identity a1) == (b :: Identity a1) = Equals_6989586621679776461 a2 b
type ShowsPrec a2 (a3 :: Identity a1) a4 
Instance details

Defined in Data.Singletons.Prelude.Identity

type ShowsPrec a2 (a3 :: Identity a1) a4 = Apply (Apply (Apply (ShowsPrec_6989586621680921156Sym0 :: TyFun Nat (Identity a1 ~> (Symbol ~> Symbol)) -> Type) a2) a3) a4
type EnumFromThenTo (a2 :: Identity a1) (a3 :: Identity a1) (a4 :: Identity a1) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type EnumFromThenTo (a2 :: Identity a1) (a3 :: Identity a1) (a4 :: Identity a1) = Apply (Apply (Apply (EnumFromThenTo_6989586621680921061Sym0 :: TyFun (Identity a1) (Identity a1 ~> (Identity a1 ~> [Identity a1])) -> Type) a2) a3) a4
type Apply (RunIdentitySym0 :: TyFun (Identity a) a -> Type) (a6989586621679707547 :: Identity a) 
Instance details

Defined in Data.Singletons.Prelude.Instances

type Apply (RunIdentitySym0 :: TyFun (Identity a) a -> Type) (a6989586621679707547 :: Identity a) = RunIdentity a6989586621679707547
type Apply (FromEnum_6989586621680921040Sym0 :: TyFun (Identity a) Nat -> Type) (a6989586621680921039 :: Identity a) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type Apply (FromEnum_6989586621680921040Sym0 :: TyFun (Identity a) Nat -> Type) (a6989586621680921039 :: Identity a) = FromEnum_6989586621680921040 a6989586621680921039
type Apply (Length_6989586621680921324Sym0 :: TyFun (Identity a) Nat -> Type) (a6989586621680921323 :: Identity a) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type Apply (Length_6989586621680921324Sym0 :: TyFun (Identity a) Nat -> Type) (a6989586621680921323 :: Identity a) = Length_6989586621680921324 a6989586621680921323
type Apply (Maximum_6989586621680921330Sym0 :: TyFun (Identity a) a -> Type) (a6989586621680921329 :: Identity a) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type Apply (Maximum_6989586621680921330Sym0 :: TyFun (Identity a) a -> Type) (a6989586621680921329 :: Identity a) = Maximum_6989586621680921330 a6989586621680921329
type Apply (Minimum_6989586621680921337Sym0 :: TyFun (Identity a) a -> Type) (a6989586621680921336 :: Identity a) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type Apply (Minimum_6989586621680921337Sym0 :: TyFun (Identity a) a -> Type) (a6989586621680921336 :: Identity a) = Minimum_6989586621680921337 a6989586621680921336
type Apply (Null_6989586621680921344Sym0 :: TyFun (Identity a) Bool -> Type) (a6989586621680921343 :: Identity a) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type Apply (Null_6989586621680921344Sym0 :: TyFun (Identity a) Bool -> Type) (a6989586621680921343 :: Identity a) = Null_6989586621680921344 a6989586621680921343
type Apply (Product_6989586621680921350Sym0 :: TyFun (Identity a) a -> Type) (a6989586621680921349 :: Identity a) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type Apply (Product_6989586621680921350Sym0 :: TyFun (Identity a) a -> Type) (a6989586621680921349 :: Identity a) = Product_6989586621680921350 a6989586621680921349
type Apply (Sum_6989586621680921357Sym0 :: TyFun (Identity a) a -> Type) (a6989586621680921356 :: Identity a) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type Apply (Sum_6989586621680921357Sym0 :: TyFun (Identity a) a -> Type) (a6989586621680921356 :: Identity a) = Sum_6989586621680921357 a6989586621680921356
type Apply (Compare_6989586621679803706Sym1 a6989586621679803704 :: TyFun (Identity a) Ordering -> Type) (a6989586621679803705 :: Identity a) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Apply (Compare_6989586621679803706Sym1 a6989586621679803704 :: TyFun (Identity a) Ordering -> Type) (a6989586621679803705 :: Identity a) = Compare_6989586621679803706 a6989586621679803704 a6989586621679803705
type Apply (Elem_6989586621680921217Sym1 a6989586621680921215 :: TyFun (Identity a) Bool -> Type) (a6989586621680921216 :: Identity a) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type Apply (Elem_6989586621680921217Sym1 a6989586621680921215 :: TyFun (Identity a) Bool -> Type) (a6989586621680921216 :: Identity a) = Elem_6989586621680921217 a6989586621680921215 a6989586621680921216
type Apply (Foldl1_6989586621680921263Sym1 a6989586621680921261 :: TyFun (Identity a) a -> Type) (a6989586621680921262 :: Identity a) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type Apply (Foldl1_6989586621680921263Sym1 a6989586621680921261 :: TyFun (Identity a) a -> Type) (a6989586621680921262 :: Identity a) = Foldl1_6989586621680921263 a6989586621680921261 a6989586621680921262
type Apply (Foldr1_6989586621680921314Sym1 a6989586621680921312 :: TyFun (Identity a) a -> Type) (a6989586621680921313 :: Identity a) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type Apply (Foldr1_6989586621680921314Sym1 a6989586621680921312 :: TyFun (Identity a) a -> Type) (a6989586621680921313 :: Identity a) = Foldr1_6989586621680921314 a6989586621680921312 a6989586621680921313
type Apply (FoldMap_6989586621680921205Sym1 a6989586621680921203 :: TyFun (Identity a) m -> Type) (a6989586621680921204 :: Identity a) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type Apply (FoldMap_6989586621680921205Sym1 a6989586621680921203 :: TyFun (Identity a) m -> Type) (a6989586621680921204 :: Identity a) = FoldMap_6989586621680921205 a6989586621680921203 a6989586621680921204
type Apply (Foldl_6989586621680921230Sym2 a6989586621680921228 a6989586621680921227 :: TyFun (Identity a) b -> Type) (a6989586621680921229 :: Identity a) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type Apply (Foldl_6989586621680921230Sym2 a6989586621680921228 a6989586621680921227 :: TyFun (Identity a) b -> Type) (a6989586621680921229 :: Identity a) = Foldl_6989586621680921230 a6989586621680921228 a6989586621680921227 a6989586621680921229
type Apply (Foldl'_6989586621680921247Sym2 a6989586621680921245 a6989586621680921244 :: TyFun (Identity a) b -> Type) (a6989586621680921246 :: Identity a) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type Apply (Foldl'_6989586621680921247Sym2 a6989586621680921245 a6989586621680921244 :: TyFun (Identity a) b -> Type) (a6989586621680921246 :: Identity a) = Foldl'_6989586621680921247 a6989586621680921245 a6989586621680921244 a6989586621680921246
type Apply (Foldr_6989586621680921275Sym2 a6989586621680921273 a6989586621680921272 :: TyFun (Identity a) b -> Type) (a6989586621680921274 :: Identity a) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type Apply (Foldr_6989586621680921275Sym2 a6989586621680921273 a6989586621680921272 :: TyFun (Identity a) b -> Type) (a6989586621680921274 :: Identity a) = Foldr_6989586621680921275 a6989586621680921273 a6989586621680921272 a6989586621680921274
type Apply (Foldr'_6989586621680921292Sym2 a6989586621680921290 a6989586621680921289 :: TyFun (Identity a) b -> Type) (a6989586621680921291 :: Identity a) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type Apply (Foldr'_6989586621680921292Sym2 a6989586621680921290 a6989586621680921289 :: TyFun (Identity a) b -> Type) (a6989586621680921291 :: Identity a) = Foldr'_6989586621680921292 a6989586621680921290 a6989586621680921289 a6989586621680921291
type Apply (Succ_6989586621680921019Sym0 :: TyFun (Identity a) (Identity a) -> Type) (a6989586621680921018 :: Identity a) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type Apply (Succ_6989586621680921019Sym0 :: TyFun (Identity a) (Identity a) -> Type) (a6989586621680921018 :: Identity a) = Succ_6989586621680921019 a6989586621680921018
type Apply (Pred_6989586621680921026Sym0 :: TyFun (Identity a) (Identity a) -> Type) (a6989586621680921025 :: Identity a) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type Apply (Pred_6989586621680921026Sym0 :: TyFun (Identity a) (Identity a) -> Type) (a6989586621680921025 :: Identity a) = Pred_6989586621680921026 a6989586621680921025
type Apply (Negate_6989586621680921114Sym0 :: TyFun (Identity a) (Identity a) -> Type) (a6989586621680921113 :: Identity a) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type Apply (Negate_6989586621680921114Sym0 :: TyFun (Identity a) (Identity a) -> Type) (a6989586621680921113 :: Identity a) = Negate_6989586621680921114 a6989586621680921113
type Apply (Abs_6989586621680921121Sym0 :: TyFun (Identity a) (Identity a) -> Type) (a6989586621680921120 :: Identity a) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type Apply (Abs_6989586621680921121Sym0 :: TyFun (Identity a) (Identity a) -> Type) (a6989586621680921120 :: Identity a) = Abs_6989586621680921121 a6989586621680921120
type Apply (Signum_6989586621680921128Sym0 :: TyFun (Identity a) (Identity a) -> Type) (a6989586621680921127 :: Identity a) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type Apply (Signum_6989586621680921128Sym0 :: TyFun (Identity a) (Identity a) -> Type) (a6989586621680921127 :: Identity a) = Signum_6989586621680921128 a6989586621680921127
type Apply (ToList_6989586621680921364Sym0 :: TyFun (Identity a) [a] -> Type) (a6989586621680921363 :: Identity a) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type Apply (ToList_6989586621680921364Sym0 :: TyFun (Identity a) [a] -> Type) (a6989586621680921363 :: Identity a) = ToList_6989586621680921364 a6989586621680921363
type Apply (EnumFromTo_6989586621680921048Sym1 a6989586621680921046 :: TyFun (Identity a) [Identity a] -> Type) (a6989586621680921047 :: Identity a) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type Apply (EnumFromTo_6989586621680921048Sym1 a6989586621680921046 :: TyFun (Identity a) [Identity a] -> Type) (a6989586621680921047 :: Identity a) = EnumFromTo_6989586621680921048 a6989586621680921046 a6989586621680921047
type Apply (TFHelper_6989586621680921079Sym1 a6989586621680921077 :: TyFun (Identity a) (Identity a) -> Type) (a6989586621680921078 :: Identity a) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type Apply (TFHelper_6989586621680921079Sym1 a6989586621680921077 :: TyFun (Identity a) (Identity a) -> Type) (a6989586621680921078 :: Identity a) = TFHelper_6989586621680921079 a6989586621680921077 a6989586621680921078
type Apply (TFHelper_6989586621680921091Sym1 a6989586621680921089 :: TyFun (Identity a) (Identity a) -> Type) (a6989586621680921090 :: Identity a) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type Apply (TFHelper_6989586621680921091Sym1 a6989586621680921089 :: TyFun (Identity a) (Identity a) -> Type) (a6989586621680921090 :: Identity a) = TFHelper_6989586621680921091 a6989586621680921089 a6989586621680921090
type Apply (TFHelper_6989586621680921103Sym1 a6989586621680921101 :: TyFun (Identity a) (Identity a) -> Type) (a6989586621680921102 :: Identity a) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type Apply (TFHelper_6989586621680921103Sym1 a6989586621680921101 :: TyFun (Identity a) (Identity a) -> Type) (a6989586621680921102 :: Identity a) = TFHelper_6989586621680921103 a6989586621680921101 a6989586621680921102
type Apply (TFHelper_6989586621680921143Sym1 a6989586621680921141 :: TyFun (Identity a) (Identity a) -> Type) (a6989586621680921142 :: Identity a) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type Apply (TFHelper_6989586621680921143Sym1 a6989586621680921141 :: TyFun (Identity a) (Identity a) -> Type) (a6989586621680921142 :: Identity a) = TFHelper_6989586621680921143 a6989586621680921141 a6989586621680921142
type Apply (EnumFromThenTo_6989586621680921061Sym2 a6989586621680921059 a6989586621680921058 :: TyFun (Identity a) [Identity a] -> Type) (a6989586621680921060 :: Identity a) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type Apply (EnumFromThenTo_6989586621680921061Sym2 a6989586621680921059 a6989586621680921058 :: TyFun (Identity a) [Identity a] -> Type) (a6989586621680921060 :: Identity a) = EnumFromThenTo_6989586621680921061 a6989586621680921059 a6989586621680921058 a6989586621680921060
type Apply (Fmap_6989586621680921174Sym1 a6989586621680921172 :: TyFun (Identity a) (Identity b) -> Type) (a6989586621680921173 :: Identity a) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type Apply (Fmap_6989586621680921174Sym1 a6989586621680921172 :: TyFun (Identity a) (Identity b) -> Type) (a6989586621680921173 :: Identity a) = Fmap_6989586621680921174 a6989586621680921172 a6989586621680921173
type Apply (TFHelper_6989586621680921186Sym1 a6989586621680921184 b :: TyFun (Identity b) (Identity a) -> Type) (a6989586621680921185 :: Identity b) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type Apply (TFHelper_6989586621680921186Sym1 a6989586621680921184 b :: TyFun (Identity b) (Identity a) -> Type) (a6989586621680921185 :: Identity b) = TFHelper_6989586621680921186 a6989586621680921184 a6989586621680921185
type Apply (TFHelper_6989586621680921381Sym1 a6989586621680921379 :: TyFun (Identity a) (Identity b) -> Type) (a6989586621680921380 :: Identity a) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type Apply (TFHelper_6989586621680921381Sym1 a6989586621680921379 :: TyFun (Identity a) (Identity b) -> Type) (a6989586621680921380 :: Identity a) = TFHelper_6989586621680921381 a6989586621680921379 a6989586621680921380
type Apply (Let6989586621680994995Scrutinee_6989586621680994595Sym1 f6989586621680994993 :: TyFun (t6989586621680988962 a6989586621680988964) (Identity (t6989586621680988962 b6989586621680988965)) -> Type) (x6989586621680994994 :: t6989586621680988962 a6989586621680988964) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type Apply (Let6989586621680994995Scrutinee_6989586621680994595Sym1 f6989586621680994993 :: TyFun (t6989586621680988962 a6989586621680988964) (Identity (t6989586621680988962 b6989586621680988965)) -> Type) (x6989586621680994994 :: t6989586621680988962 a6989586621680988964) = Let6989586621680994995Scrutinee_6989586621680994595 f6989586621680994993 x6989586621680994994
type Apply (Traverse_6989586621680995197Sym1 a6989586621680995195 :: TyFun (Identity a) (f (Identity b)) -> Type) (a6989586621680995196 :: Identity a) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type Apply (Traverse_6989586621680995197Sym1 a6989586621680995195 :: TyFun (Identity a) (f (Identity b)) -> Type) (a6989586621680995196 :: Identity a) = Traverse_6989586621680995197 a6989586621680995195 a6989586621680995196
type Apply (LiftA2_6989586621680921394Sym2 a6989586621680921392 a6989586621680921391 :: TyFun (Identity b) (Identity c) -> Type) (a6989586621680921393 :: Identity b) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type Apply (LiftA2_6989586621680921394Sym2 a6989586621680921392 a6989586621680921391 :: TyFun (Identity b) (Identity c) -> Type) (a6989586621680921393 :: Identity b) = LiftA2_6989586621680921394 a6989586621680921392 a6989586621680921391 a6989586621680921393
type Apply (Compare_6989586621679803706Sym0 :: TyFun (Identity a6989586621679087410) (Identity a6989586621679087410 ~> Ordering) -> Type) (a6989586621679803704 :: Identity a6989586621679087410) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Apply (Compare_6989586621679803706Sym0 :: TyFun (Identity a6989586621679087410) (Identity a6989586621679087410 ~> Ordering) -> Type) (a6989586621679803704 :: Identity a6989586621679087410) = Compare_6989586621679803706Sym1 a6989586621679803704
type Apply (EnumFromTo_6989586621680921048Sym0 :: TyFun (Identity a6989586621680920912) (Identity a6989586621680920912 ~> [Identity a6989586621680920912]) -> Type) (a6989586621680921046 :: Identity a6989586621680920912) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type Apply (EnumFromTo_6989586621680921048Sym0 :: TyFun (Identity a6989586621680920912) (Identity a6989586621680920912 ~> [Identity a6989586621680920912]) -> Type) (a6989586621680921046 :: Identity a6989586621680920912) = EnumFromTo_6989586621680921048Sym1 a6989586621680921046
type Apply (EnumFromThenTo_6989586621680921061Sym0 :: TyFun (Identity a6989586621680920912) (Identity a6989586621680920912 ~> (Identity a6989586621680920912 ~> [Identity a6989586621680920912])) -> Type) (a6989586621680921058 :: Identity a6989586621680920912) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type Apply (EnumFromThenTo_6989586621680921061Sym0 :: TyFun (Identity a6989586621680920912) (Identity a6989586621680920912 ~> (Identity a6989586621680920912 ~> [Identity a6989586621680920912])) -> Type) (a6989586621680921058 :: Identity a6989586621680920912) = EnumFromThenTo_6989586621680921061Sym1 a6989586621680921058
type Apply (TFHelper_6989586621680921079Sym0 :: TyFun (Identity a6989586621680920923) (Identity a6989586621680920923 ~> Identity a6989586621680920923) -> Type) (a6989586621680921077 :: Identity a6989586621680920923) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type Apply (TFHelper_6989586621680921079Sym0 :: TyFun (Identity a6989586621680920923) (Identity a6989586621680920923 ~> Identity a6989586621680920923) -> Type) (a6989586621680921077 :: Identity a6989586621680920923) = TFHelper_6989586621680921079Sym1 a6989586621680921077
type Apply (TFHelper_6989586621680921091Sym0 :: TyFun (Identity a6989586621680920923) (Identity a6989586621680920923 ~> Identity a6989586621680920923) -> Type) (a6989586621680921089 :: Identity a6989586621680920923) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type Apply (TFHelper_6989586621680921091Sym0 :: TyFun (Identity a6989586621680920923) (Identity a6989586621680920923 ~> Identity a6989586621680920923) -> Type) (a6989586621680921089 :: Identity a6989586621680920923) = TFHelper_6989586621680921091Sym1 a6989586621680921089
type Apply (TFHelper_6989586621680921103Sym0 :: TyFun (Identity a6989586621680920923) (Identity a6989586621680920923 ~> Identity a6989586621680920923) -> Type) (a6989586621680921101 :: Identity a6989586621680920923) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type Apply (TFHelper_6989586621680921103Sym0 :: TyFun (Identity a6989586621680920923) (Identity a6989586621680920923 ~> Identity a6989586621680920923) -> Type) (a6989586621680921101 :: Identity a6989586621680920923) = TFHelper_6989586621680921103Sym1 a6989586621680921101
type Apply (TFHelper_6989586621680921143Sym0 :: TyFun (Identity a6989586621680920934) (Identity a6989586621680920934 ~> Identity a6989586621680920934) -> Type) (a6989586621680921141 :: Identity a6989586621680920934) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type Apply (TFHelper_6989586621680921143Sym0 :: TyFun (Identity a6989586621680920934) (Identity a6989586621680920934 ~> Identity a6989586621680920934) -> Type) (a6989586621680921141 :: Identity a6989586621680920934) = TFHelper_6989586621680921143Sym1 a6989586621680921141
type Apply (EnumFromThenTo_6989586621680921061Sym1 a6989586621680921058 :: TyFun (Identity a6989586621680920912) (Identity a6989586621680920912 ~> [Identity a6989586621680920912]) -> Type) (a6989586621680921059 :: Identity a6989586621680920912) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type Apply (EnumFromThenTo_6989586621680921061Sym1 a6989586621680921058 :: TyFun (Identity a6989586621680920912) (Identity a6989586621680920912 ~> [Identity a6989586621680920912]) -> Type) (a6989586621680921059 :: Identity a6989586621680920912) = EnumFromThenTo_6989586621680921061Sym2 a6989586621680921058 a6989586621680921059
type Apply (ShowsPrec_6989586621680921156Sym1 a6989586621680921153 a6989586621680920937 :: TyFun (Identity a6989586621680920937) (Symbol ~> Symbol) -> Type) (a6989586621680921154 :: Identity a6989586621680920937) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type Apply (ShowsPrec_6989586621680921156Sym1 a6989586621680921153 a6989586621680920937 :: TyFun (Identity a6989586621680920937) (Symbol ~> Symbol) -> Type) (a6989586621680921154 :: Identity a6989586621680920937) = ShowsPrec_6989586621680921156Sym2 a6989586621680921153 a6989586621680921154
type Apply (TFHelper_6989586621680921410Sym0 :: TyFun (Identity a6989586621679962832) ((a6989586621679962832 ~> Identity b6989586621679962833) ~> Identity b6989586621679962833) -> Type) (a6989586621680921408 :: Identity a6989586621679962832) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type Apply (TFHelper_6989586621680921410Sym0 :: TyFun (Identity a6989586621679962832) ((a6989586621679962832 ~> Identity b6989586621679962833) ~> Identity b6989586621679962833) -> Type) (a6989586621680921408 :: Identity a6989586621679962832) = TFHelper_6989586621680921410Sym1 a6989586621680921408 b6989586621679962833 :: TyFun (a6989586621679962832 ~> Identity b6989586621679962833) (Identity b6989586621679962833) -> Type
type Apply (TFHelper_6989586621680921381Sym0 :: TyFun (Identity (a6989586621679962809 ~> b6989586621679962810)) (Identity a6989586621679962809 ~> Identity b6989586621679962810) -> Type) (a6989586621680921379 :: Identity (a6989586621679962809 ~> b6989586621679962810)) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type Apply (TFHelper_6989586621680921381Sym0 :: TyFun (Identity (a6989586621679962809 ~> b6989586621679962810)) (Identity a6989586621679962809 ~> Identity b6989586621679962810) -> Type) (a6989586621680921379 :: Identity (a6989586621679962809 ~> b6989586621679962810)) = TFHelper_6989586621680921381Sym1 a6989586621680921379
type Apply (LiftA2_6989586621680921394Sym1 a6989586621680921391 :: TyFun (Identity a6989586621679962811) (Identity b6989586621679962812 ~> Identity c6989586621679962813) -> Type) (a6989586621680921392 :: Identity a6989586621679962811) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type Apply (LiftA2_6989586621680921394Sym1 a6989586621680921391 :: TyFun (Identity a6989586621679962811) (Identity b6989586621679962812 ~> Identity c6989586621679962813) -> Type) (a6989586621680921392 :: Identity a6989586621679962811) = LiftA2_6989586621680921394Sym2 a6989586621680921391 a6989586621680921392
type Apply (TFHelper_6989586621680921410Sym1 a6989586621680921408 b :: TyFun (a ~> Identity b) (Identity b) -> Type) (a6989586621680921409 :: a ~> Identity b) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type Apply (TFHelper_6989586621680921410Sym1 a6989586621680921408 b :: TyFun (a ~> Identity b) (Identity b) -> Type) (a6989586621680921409 :: a ~> Identity b) = TFHelper_6989586621680921410 a6989586621680921408 a6989586621680921409
type Apply (Foldl1_6989586621680921263Sym0 :: TyFun (a6989586621680742394 ~> (a6989586621680742394 ~> a6989586621680742394)) (Identity a6989586621680742394 ~> a6989586621680742394) -> Type) (a6989586621680921261 :: a6989586621680742394 ~> (a6989586621680742394 ~> a6989586621680742394)) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type Apply (Foldl1_6989586621680921263Sym0 :: TyFun (a6989586621680742394 ~> (a6989586621680742394 ~> a6989586621680742394)) (Identity a6989586621680742394 ~> a6989586621680742394) -> Type) (a6989586621680921261 :: a6989586621680742394 ~> (a6989586621680742394 ~> a6989586621680742394)) = Foldl1_6989586621680921263Sym1 a6989586621680921261
type Apply (Foldr1_6989586621680921314Sym0 :: TyFun (a6989586621680742393 ~> (a6989586621680742393 ~> a6989586621680742393)) (Identity a6989586621680742393 ~> a6989586621680742393) -> Type) (a6989586621680921312 :: a6989586621680742393 ~> (a6989586621680742393 ~> a6989586621680742393)) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type Apply (Foldr1_6989586621680921314Sym0 :: TyFun (a6989586621680742393 ~> (a6989586621680742393 ~> a6989586621680742393)) (Identity a6989586621680742393 ~> a6989586621680742393) -> Type) (a6989586621680921312 :: a6989586621680742393 ~> (a6989586621680742393 ~> a6989586621680742393)) = Foldr1_6989586621680921314Sym1 a6989586621680921312
type Apply (Fmap_6989586621680921174Sym0 :: TyFun (a6989586621679962803 ~> b6989586621679962804) (Identity a6989586621679962803 ~> Identity b6989586621679962804) -> Type) (a6989586621680921172 :: a6989586621679962803 ~> b6989586621679962804) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type Apply (Fmap_6989586621680921174Sym0 :: TyFun (a6989586621679962803 ~> b6989586621679962804) (Identity a6989586621679962803 ~> Identity b6989586621679962804) -> Type) (a6989586621680921172 :: a6989586621679962803 ~> b6989586621679962804) = Fmap_6989586621680921174Sym1 a6989586621680921172
type Apply (FoldMap_6989586621680921205Sym0 :: TyFun (a6989586621680742384 ~> m6989586621680742383) (Identity a6989586621680742384 ~> m6989586621680742383) -> Type) (a6989586621680921203 :: a6989586621680742384 ~> m6989586621680742383) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type Apply (FoldMap_6989586621680921205Sym0 :: TyFun (a6989586621680742384 ~> m6989586621680742383) (Identity a6989586621680742384 ~> m6989586621680742383) -> Type) (a6989586621680921203 :: a6989586621680742384 ~> m6989586621680742383) = FoldMap_6989586621680921205Sym1 a6989586621680921203
type Apply (Foldl_6989586621680921230Sym0 :: TyFun (b6989586621680742389 ~> (a6989586621680742390 ~> b6989586621680742389)) (b6989586621680742389 ~> (Identity a6989586621680742390 ~> b6989586621680742389)) -> Type) (a6989586621680921227 :: b6989586621680742389 ~> (a6989586621680742390 ~> b6989586621680742389)) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type Apply (Foldl_6989586621680921230Sym0 :: TyFun (b6989586621680742389 ~> (a6989586621680742390 ~> b6989586621680742389)) (b6989586621680742389 ~> (Identity a6989586621680742390 ~> b6989586621680742389)) -> Type) (a6989586621680921227 :: b6989586621680742389 ~> (a6989586621680742390 ~> b6989586621680742389)) = Foldl_6989586621680921230Sym1 a6989586621680921227
type Apply (Foldl'_6989586621680921247Sym0 :: TyFun (b6989586621680742391 ~> (a6989586621680742392 ~> b6989586621680742391)) (b6989586621680742391 ~> (Identity a6989586621680742392 ~> b6989586621680742391)) -> Type) (a6989586621680921244 :: b6989586621680742391 ~> (a6989586621680742392 ~> b6989586621680742391)) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type Apply (Foldl'_6989586621680921247Sym0 :: TyFun (b6989586621680742391 ~> (a6989586621680742392 ~> b6989586621680742391)) (b6989586621680742391 ~> (Identity a6989586621680742392 ~> b6989586621680742391)) -> Type) (a6989586621680921244 :: b6989586621680742391 ~> (a6989586621680742392 ~> b6989586621680742391)) = Foldl'_6989586621680921247Sym1 a6989586621680921244
type Apply (Foldr_6989586621680921275Sym0 :: TyFun (a6989586621680742385 ~> (b6989586621680742386 ~> b6989586621680742386)) (b6989586621680742386 ~> (Identity a6989586621680742385 ~> b6989586621680742386)) -> Type) (a6989586621680921272 :: a6989586621680742385 ~> (b6989586621680742386 ~> b6989586621680742386)) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type Apply (Foldr_6989586621680921275Sym0 :: TyFun (a6989586621680742385 ~> (b6989586621680742386 ~> b6989586621680742386)) (b6989586621680742386 ~> (Identity a6989586621680742385 ~> b6989586621680742386)) -> Type) (a6989586621680921272 :: a6989586621680742385 ~> (b6989586621680742386 ~> b6989586621680742386)) = Foldr_6989586621680921275Sym1 a6989586621680921272
type Apply (Foldr'_6989586621680921292Sym0 :: TyFun (a6989586621680742387 ~> (b6989586621680742388 ~> b6989586621680742388)) (b6989586621680742388 ~> (Identity a6989586621680742387 ~> b6989586621680742388)) -> Type) (a6989586621680921289 :: a6989586621680742387 ~> (b6989586621680742388 ~> b6989586621680742388)) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type Apply (Foldr'_6989586621680921292Sym0 :: TyFun (a6989586621680742387 ~> (b6989586621680742388 ~> b6989586621680742388)) (b6989586621680742388 ~> (Identity a6989586621680742387 ~> b6989586621680742388)) -> Type) (a6989586621680921289 :: a6989586621680742387 ~> (b6989586621680742388 ~> b6989586621680742388)) = Foldr'_6989586621680921292Sym1 a6989586621680921289
type Apply (Let6989586621680994995Scrutinee_6989586621680994595Sym0 :: TyFun (a6989586621680988964 ~> b6989586621680988965) (TyFun (t6989586621680988962 a6989586621680988964) (Identity (t6989586621680988962 b6989586621680988965)) -> Type) -> Type) (f6989586621680994993 :: a6989586621680988964 ~> b6989586621680988965) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type Apply (Let6989586621680994995Scrutinee_6989586621680994595Sym0 :: TyFun (a6989586621680988964 ~> b6989586621680988965) (TyFun (t6989586621680988962 a6989586621680988964) (Identity (t6989586621680988962 b6989586621680988965)) -> Type) -> Type) (f6989586621680994993 :: a6989586621680988964 ~> b6989586621680988965) = Let6989586621680994995Scrutinee_6989586621680994595Sym1 f6989586621680994993 :: TyFun (t6989586621680988962 a6989586621680988964) (Identity (t6989586621680988962 b6989586621680988965)) -> Type
type Apply (Traverse_6989586621680995197Sym0 :: TyFun (a6989586621680988964 ~> f6989586621680988963 b6989586621680988965) (Identity a6989586621680988964 ~> f6989586621680988963 (Identity b6989586621680988965)) -> Type) (a6989586621680995195 :: a6989586621680988964 ~> f6989586621680988963 b6989586621680988965) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type Apply (Traverse_6989586621680995197Sym0 :: TyFun (a6989586621680988964 ~> f6989586621680988963 b6989586621680988965) (Identity a6989586621680988964 ~> f6989586621680988963 (Identity b6989586621680988965)) -> Type) (a6989586621680995195 :: a6989586621680988964 ~> f6989586621680988963 b6989586621680988965) = Traverse_6989586621680995197Sym1 a6989586621680995195
type Apply (LiftA2_6989586621680921394Sym0 :: TyFun (a6989586621679962811 ~> (b6989586621679962812 ~> c6989586621679962813)) (Identity a6989586621679962811 ~> (Identity b6989586621679962812 ~> Identity c6989586621679962813)) -> Type) (a6989586621680921391 :: a6989586621679962811 ~> (b6989586621679962812 ~> c6989586621679962813)) 
Instance details

Defined in Data.Singletons.Prelude.Identity

type Apply (LiftA2_6989586621680921394Sym0 :: TyFun (a6989586621679962811 ~> (b6989586621679962812 ~> c6989586621679962813)) (Identity a6989586621679962811 ~> (Identity b6989586621679962812 ~> Identity c6989586621679962813)) -> Type) (a6989586621680921391 :: a6989586621679962811 ~> (b6989586621679962812 ~> c6989586621679962813)) = LiftA2_6989586621680921394Sym1 a6989586621680921391
type Unwrappable (NamedF Identity a name) 
Instance details

Defined in Lorentz.Wrappable

type Unwrappable (NamedF Identity a name) = a
type ToT (NamedF Identity a name) 
Instance details

Defined in Michelson.Typed.Haskell.Value

type ToT (NamedF Identity a name) = ToT (Identity a)

stderr :: Handle #

A handle managing output to the Haskell program's standard error channel.

stdin :: Handle #

A handle managing input from the Haskell program's standard input channel.

withFrozenCallStack :: HasCallStack => (HasCallStack => a) -> a #

Perform some computation without adding new entries to the CallStack.

Since: base-4.9.0.0

callStack :: HasCallStack => CallStack #

Return the current CallStack.

Does *not* include the call-site of callStack.

Since: base-4.9.0.0

writeTVar :: TVar a -> a -> STM () #

Write the supplied value into a TVar.

readTVar :: TVar a -> STM a #

Return the current value stored in a TVar.

newTVar :: a -> STM (TVar a) #

Create a new TVar holding a value supplied

data STM a #

A monad supporting atomic memory transactions.

Instances

Instances details
Monad STM

Since: base-4.3.0.0

Instance details

Defined in GHC.Conc.Sync

Methods

(>>=) :: STM a -> (a -> STM b) -> STM b #

(>>) :: STM a -> STM b -> STM b #

return :: a -> STM a #

Functor STM

Since: base-4.3.0.0

Instance details

Defined in GHC.Conc.Sync

Methods

fmap :: (a -> b) -> STM a -> STM b #

(<$) :: a -> STM b -> STM a #

Applicative STM

Since: base-4.8.0.0

Instance details

Defined in GHC.Conc.Sync

Methods

pure :: a -> STM a #

(<*>) :: STM (a -> b) -> STM a -> STM b #

liftA2 :: (a -> b -> c) -> STM a -> STM b -> STM c #

(*>) :: STM a -> STM b -> STM b #

(<*) :: STM a -> STM b -> STM a #

Alternative STM

Since: base-4.8.0.0

Instance details

Defined in GHC.Conc.Sync

Methods

empty :: STM a #

(<|>) :: STM a -> STM a -> STM a #

some :: STM a -> STM [a] #

many :: STM a -> STM [a] #

MonadPlus STM

Since: base-4.3.0.0

Instance details

Defined in GHC.Conc.Sync

Methods

mzero :: STM a #

mplus :: STM a -> STM a -> STM a #

MonadThrow STM 
Instance details

Defined in Control.Monad.Catch

Methods

throwM :: Exception e => e -> STM a #

MonadCatch STM 
Instance details

Defined in Control.Monad.Catch

Methods

catch :: Exception e => STM a -> (e -> STM a) -> STM a #

data TVar a #

Shared memory locations that support atomic memory transactions.

Instances

Instances details
Eq (TVar a)

Since: base-4.8.0.0

Instance details

Defined in GHC.Conc.Sync

Methods

(==) :: TVar a -> TVar a -> Bool #

(/=) :: TVar a -> TVar a -> Bool #

data IORef a #

A mutable variable in the IO monad

Instances

Instances details
NFData1 IORef

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

liftRnf :: (a -> ()) -> IORef a -> () #

Eq (IORef a)

Pointer equality.

Since: base-4.0.0.0

Instance details

Defined in GHC.IORef

Methods

(==) :: IORef a -> IORef a -> Bool #

(/=) :: IORef a -> IORef a -> Bool #

NFData (IORef a)

NOTE: Only strict in the reference and not the referenced value.

Since: deepseq-1.4.2.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: IORef a -> () #

type FilePath = String #

File and directory names are values of type String, whose precise meaning is operating system dependent. Files can be opened, yielding a handle which can then be used to operate on the contents of that file.

prettyCallStack :: CallStack -> String #

Pretty print a CallStack.

Since: base-4.9.0.0

prettySrcLoc :: SrcLoc -> String #

Pretty print a SrcLoc.

Since: base-4.9.0.0

class (Typeable e, Show e) => Exception e where #

Any type that you wish to throw or catch as an exception must be an instance of the Exception class. The simplest case is a new exception type directly below the root:

data MyException = ThisException | ThatException
    deriving Show

instance Exception MyException

The default method definitions in the Exception class do what we need in this case. You can now throw and catch ThisException and ThatException as exceptions:

*Main> throw ThisException `catch` \e -> putStrLn ("Caught " ++ show (e :: MyException))
Caught ThisException

In more complicated examples, you may wish to define a whole hierarchy of exceptions:

---------------------------------------------------------------------
-- Make the root exception type for all the exceptions in a compiler

data SomeCompilerException = forall e . Exception e => SomeCompilerException e

instance Show SomeCompilerException where
    show (SomeCompilerException e) = show e

instance Exception SomeCompilerException

compilerExceptionToException :: Exception e => e -> SomeException
compilerExceptionToException = toException . SomeCompilerException

compilerExceptionFromException :: Exception e => SomeException -> Maybe e
compilerExceptionFromException x = do
    SomeCompilerException a <- fromException x
    cast a

---------------------------------------------------------------------
-- Make a subhierarchy for exceptions in the frontend of the compiler

data SomeFrontendException = forall e . Exception e => SomeFrontendException e

instance Show SomeFrontendException where
    show (SomeFrontendException e) = show e

instance Exception SomeFrontendException where
    toException = compilerExceptionToException
    fromException = compilerExceptionFromException

frontendExceptionToException :: Exception e => e -> SomeException
frontendExceptionToException = toException . SomeFrontendException

frontendExceptionFromException :: Exception e => SomeException -> Maybe e
frontendExceptionFromException x = do
    SomeFrontendException a <- fromException x
    cast a

---------------------------------------------------------------------
-- Make an exception type for a particular frontend compiler exception

data MismatchedParentheses = MismatchedParentheses
    deriving Show

instance Exception MismatchedParentheses where
    toException   = frontendExceptionToException
    fromException = frontendExceptionFromException

We can now catch a MismatchedParentheses exception as MismatchedParentheses, SomeFrontendException or SomeCompilerException, but not other types, e.g. IOException:

*Main> throw MismatchedParentheses `catch` \e -> putStrLn ("Caught " ++ show (e :: MismatchedParentheses))
Caught MismatchedParentheses
*Main> throw MismatchedParentheses `catch` \e -> putStrLn ("Caught " ++ show (e :: SomeFrontendException))
Caught MismatchedParentheses
*Main> throw MismatchedParentheses `catch` \e -> putStrLn ("Caught " ++ show (e :: SomeCompilerException))
Caught MismatchedParentheses
*Main> throw MismatchedParentheses `catch` \e -> putStrLn ("Caught " ++ show (e :: IOException))
*** Exception: MismatchedParentheses

Minimal complete definition

Nothing

Methods

toException :: e -> SomeException #

fromException :: SomeException -> Maybe e #

displayException :: e -> String #

Render this exception value in a human-friendly manner.

Default implementation: show.

Since: base-4.8.0.0

Instances

Instances details
Exception Void

Since: base-4.8.0.0

Instance details

Defined in Data.Void

Exception BlockedIndefinitelyOnMVar

Since: base-4.1.0.0

Instance details

Defined in GHC.IO.Exception

Exception BlockedIndefinitelyOnSTM

Since: base-4.1.0.0

Instance details

Defined in GHC.IO.Exception

Exception Deadlock

Since: base-4.1.0.0

Instance details

Defined in GHC.IO.Exception

Exception AllocationLimitExceeded

Since: base-4.8.0.0

Instance details

Defined in GHC.IO.Exception

Exception CompactionFailed

Since: base-4.10.0.0

Instance details

Defined in GHC.IO.Exception

Exception AssertionFailed

Since: base-4.1.0.0

Instance details

Defined in GHC.IO.Exception

Exception SomeAsyncException

Since: base-4.7.0.0

Instance details

Defined in GHC.IO.Exception

Exception AsyncException

Since: base-4.7.0.0

Instance details

Defined in GHC.IO.Exception

Exception ArrayException

Since: base-4.1.0.0

Instance details

Defined in GHC.IO.Exception

Exception FixIOException

Since: base-4.11.0.0

Instance details

Defined in GHC.IO.Exception

Exception ExitCode

Since: base-4.1.0.0

Instance details

Defined in GHC.IO.Exception

Exception IOException

Since: base-4.1.0.0

Instance details

Defined in GHC.IO.Exception

Exception ErrorCall

Since: base-4.0.0.0

Instance details

Defined in GHC.Exception

Exception ArithException

Since: base-4.0.0.0

Instance details

Defined in GHC.Exception.Type

Exception SomeException

Since: base-3.0

Instance details

Defined in GHC.Exception.Type

Exception ASCII7_Invalid 
Instance details

Defined in Basement.String.Encoding.ASCII7

Methods

toException :: ASCII7_Invalid -> SomeException #

fromException :: SomeException -> Maybe ASCII7_Invalid #

displayException :: ASCII7_Invalid -> String #

Exception ISO_8859_1_Invalid 
Instance details

Defined in Basement.String.Encoding.ISO_8859_1

Methods

toException :: ISO_8859_1_Invalid -> SomeException #

fromException :: SomeException -> Maybe ISO_8859_1_Invalid #

displayException :: ISO_8859_1_Invalid -> String #

Exception UTF16_Invalid 
Instance details

Defined in Basement.String.Encoding.UTF16

Methods

toException :: UTF16_Invalid -> SomeException #

fromException :: SomeException -> Maybe UTF16_Invalid #

displayException :: UTF16_Invalid -> String #

Exception UTF32_Invalid 
Instance details

Defined in Basement.String.Encoding.UTF32

Methods

toException :: UTF32_Invalid -> SomeException #

fromException :: SomeException -> Maybe UTF32_Invalid #

displayException :: UTF32_Invalid -> String #

Exception BimapException 
Instance details

Defined in Data.Bimap

Methods

toException :: BimapException -> SomeException #

fromException :: SomeException -> Maybe BimapException #

displayException :: BimapException -> String #

Exception CryptoError 
Instance details

Defined in Crypto.Error.Types

Exception InvalidPosException 
Instance details

Defined in Text.Megaparsec.Pos

Buildable ExpandedInstr => Exception TCError 
Instance details

Defined in Michelson.TypeCheck.Error

Exception ParserException 
Instance details

Defined in Michelson.Parser.Error

Exception UnpackError 
Instance details

Defined in Util.Binary

Exception Bug 
Instance details

Defined in Universum.Exception

Exception UnicodeException 
Instance details

Defined in Data.Text.Encoding.Error

Exception StringException 
Instance details

Defined in Control.Exception.Safe

Exception SyncExceptionWrapper 
Instance details

Defined in Control.Exception.Safe

Exception AsyncExceptionWrapper 
Instance details

Defined in Control.Exception.Safe

(Show s, Show (Token s), Show e, ShowErrorComponent e, Stream s, Typeable s, Typeable e) => Exception (ParseErrorBundle s e) 
Instance details

Defined in Text.Megaparsec.Error

(Show s, Show (Token s), Show e, ShowErrorComponent e, Stream s, Typeable s, Typeable e) => Exception (ParseError s e) 
Instance details

Defined in Text.Megaparsec.Error

newtype Const a (b :: k) #

The Const functor.

Constructors

Const 

Fields

Instances

Instances details
() :=> (Functor (Const a :: Type -> Type)) 
Instance details

Defined in Data.Constraint

Methods

ins :: () :- Functor (Const a) #

Generic1 (Const a :: k -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Associated Types

type Rep1 (Const a) :: k -> Type #

Methods

from1 :: forall (a0 :: k0). Const a a0 -> Rep1 (Const a) a0 #

to1 :: forall (a0 :: k0). Rep1 (Const a) a0 -> Const a a0 #

Unbox a => Vector Vector (Const a b) 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicUnsafeFreeze :: PrimMonad m => Mutable Vector (PrimState m) (Const a b) -> m (Vector (Const a b)) #

basicUnsafeThaw :: PrimMonad m => Vector (Const a b) -> m (Mutable Vector (PrimState m) (Const a b)) #

basicLength :: Vector (Const a b) -> Int #

basicUnsafeSlice :: Int -> Int -> Vector (Const a b) -> Vector (Const a b) #

basicUnsafeIndexM :: Monad m => Vector (Const a b) -> Int -> m (Const a b) #

basicUnsafeCopy :: PrimMonad m => Mutable Vector (PrimState m) (Const a b) -> Vector (Const a b) -> m () #

elemseq :: Vector (Const a b) -> Const a b -> b0 -> b0 #

Unbox a => MVector MVector (Const a b) 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicLength :: MVector s (Const a b) -> Int #

basicUnsafeSlice :: Int -> Int -> MVector s (Const a b) -> MVector s (Const a b) #

basicOverlaps :: MVector s (Const a b) -> MVector s (Const a b) -> Bool #

basicUnsafeNew :: PrimMonad m => Int -> m (MVector (PrimState m) (Const a b)) #

basicInitialize :: PrimMonad m => MVector (PrimState m) (Const a b) -> m () #

basicUnsafeReplicate :: PrimMonad m => Int -> Const a b -> m (MVector (PrimState m) (Const a b)) #

basicUnsafeRead :: PrimMonad m => MVector (PrimState m) (Const a b) -> Int -> m (Const a b) #

basicUnsafeWrite :: PrimMonad m => MVector (PrimState m) (Const a b) -> Int -> Const a b -> m () #

basicClear :: PrimMonad m => MVector (PrimState m) (Const a b) -> m () #

basicSet :: PrimMonad m => MVector (PrimState m) (Const a b) -> Const a b -> m () #

basicUnsafeCopy :: PrimMonad m => MVector (PrimState m) (Const a b) -> MVector (PrimState m) (Const a b) -> m () #

basicUnsafeMove :: PrimMonad m => MVector (PrimState m) (Const a b) -> MVector (PrimState m) (Const a b) -> m () #

basicUnsafeGrow :: PrimMonad m => MVector (PrimState m) (Const a b) -> Int -> m (MVector (PrimState m) (Const a b)) #

Bifunctor (Const :: Type -> Type -> Type)

Since: base-4.8.0.0

Instance details

Defined in Data.Bifunctor

Methods

bimap :: (a -> b) -> (c -> d) -> Const a c -> Const b d #

first :: (a -> b) -> Const a c -> Const b c #

second :: (b -> c) -> Const a b -> Const a c #

NFData2 (Const :: Type -> Type -> Type)

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

liftRnf2 :: (a -> ()) -> (b -> ()) -> Const a b -> () #

Hashable2 (Const :: Type -> Type -> Type) 
Instance details

Defined in Data.Hashable.Class

Methods

liftHashWithSalt2 :: (Int -> a -> Int) -> (Int -> b -> Int) -> Int -> Const a b -> Int #

(Bounded a) :=> (Bounded (Const a b)) 
Instance details

Defined in Data.Constraint

Methods

ins :: Bounded a :- Bounded (Const a b) #

(Enum a) :=> (Enum (Const a b)) 
Instance details

Defined in Data.Constraint

Methods

ins :: Enum a :- Enum (Const a b) #

(Eq a) :=> (Eq (Const a b)) 
Instance details

Defined in Data.Constraint

Methods

ins :: Eq a :- Eq (Const a b) #

(Floating a) :=> (Floating (Const a b)) 
Instance details

Defined in Data.Constraint

Methods

ins :: Floating a :- Floating (Const a b) #

(Fractional a) :=> (Fractional (Const a b)) 
Instance details

Defined in Data.Constraint

Methods

ins :: Fractional a :- Fractional (Const a b) #

(Integral a) :=> (Integral (Const a b)) 
Instance details

Defined in Data.Constraint

Methods

ins :: Integral a :- Integral (Const a b) #

(Num a) :=> (Num (Const a b)) 
Instance details

Defined in Data.Constraint

Methods

ins :: Num a :- Num (Const a b) #

(Ord a) :=> (Ord (Const a b)) 
Instance details

Defined in Data.Constraint

Methods

ins :: Ord a :- Ord (Const a b) #

(Read a) :=> (Read (Const a b)) 
Instance details

Defined in Data.Constraint

Methods

ins :: Read a :- Read (Const a b) #

(Real a) :=> (Real (Const a b)) 
Instance details

Defined in Data.Constraint

Methods

ins :: Real a :- Real (Const a b) #

(RealFloat a) :=> (RealFloat (Const a b)) 
Instance details

Defined in Data.Constraint

Methods

ins :: RealFloat a :- RealFloat (Const a b) #

(RealFrac a) :=> (RealFrac (Const a b)) 
Instance details

Defined in Data.Constraint

Methods

ins :: RealFrac a :- RealFrac (Const a b) #

(Show a) :=> (Show (Const a b)) 
Instance details

Defined in Data.Constraint

Methods

ins :: Show a :- Show (Const a b) #

(Semigroup a) :=> (Semigroup (Const a b)) 
Instance details

Defined in Data.Constraint

Methods

ins :: Semigroup a :- Semigroup (Const a b) #

(Monoid a) :=> (Monoid (Const a b)) 
Instance details

Defined in Data.Constraint

Methods

ins :: Monoid a :- Monoid (Const a b) #

(Monoid a) :=> (Applicative (Const a :: Type -> Type)) 
Instance details

Defined in Data.Constraint

Methods

ins :: Monoid a :- Applicative (Const a) #

(Bits a) :=> (Bits (Const a b)) 
Instance details

Defined in Data.Constraint

Methods

ins :: Bits a :- Bits (Const a b) #

Functor (Const m :: Type -> Type)

Since: base-2.1

Instance details

Defined in Data.Functor.Const

Methods

fmap :: (a -> b) -> Const m a -> Const m b #

(<$) :: a -> Const m b -> Const m a #

Monoid m => Applicative (Const m :: Type -> Type)

Since: base-2.0.1

Instance details

Defined in Data.Functor.Const

Methods

pure :: a -> Const m a #

(<*>) :: Const m (a -> b) -> Const m a -> Const m b #

liftA2 :: (a -> b -> c) -> Const m a -> Const m b -> Const m c #

(*>) :: Const m a -> Const m b -> Const m b #

(<*) :: Const m a -> Const m b -> Const m a #

Foldable (Const m :: Type -> Type)

Since: base-4.7.0.0

Instance details

Defined in Data.Functor.Const

Methods

fold :: Monoid m0 => Const m m0 -> m0 #

foldMap :: Monoid m0 => (a -> m0) -> Const m a -> m0 #

foldMap' :: Monoid m0 => (a -> m0) -> Const m a -> m0 #

foldr :: (a -> b -> b) -> b -> Const m a -> b #

foldr' :: (a -> b -> b) -> b -> Const m a -> b #

foldl :: (b -> a -> b) -> b -> Const m a -> b #

foldl' :: (b -> a -> b) -> b -> Const m a -> b #

foldr1 :: (a -> a -> a) -> Const m a -> a #

foldl1 :: (a -> a -> a) -> Const m a -> a #

toList :: Const m a -> [a] #

null :: Const m a -> Bool #

length :: Const m a -> Int #

elem :: Eq a => a -> Const m a -> Bool #

maximum :: Ord a => Const m a -> a #

minimum :: Ord a => Const m a -> a #

sum :: Num a => Const m a -> a #

product :: Num a => Const m a -> a #

Traversable (Const m :: Type -> Type)

Since: base-4.7.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> Const m a -> f (Const m b) #

sequenceA :: Applicative f => Const m (f a) -> f (Const m a) #

mapM :: Monad m0 => (a -> m0 b) -> Const m a -> m0 (Const m b) #

sequence :: Monad m0 => Const m (m0 a) -> m0 (Const m a) #

NFData a => NFData1 (Const a :: Type -> Type)

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

liftRnf :: (a0 -> ()) -> Const a a0 -> () #

Hashable a => Hashable1 (Const a :: Type -> Type) 
Instance details

Defined in Data.Hashable.Class

Methods

liftHashWithSalt :: (Int -> a0 -> Int) -> Int -> Const a a0 -> Int #

PTraversable (Const m :: Type -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

Associated Types

type Traverse arg0 arg1 :: f0 (t0 b0) #

type SequenceA arg0 :: f0 (t0 a0) #

type MapM arg0 arg1 :: m0 (t0 b0) #

type Sequence arg0 :: m0 (t0 a0) #

STraversable (Const m :: Type -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

Methods

sTraverse :: forall a (f :: Type -> Type) b (t1 :: a ~> f b) (t2 :: Const m a). SApplicative f => Sing t1 -> Sing t2 -> Sing (Apply (Apply TraverseSym0 t1) t2) #

sSequenceA :: forall (f :: Type -> Type) a (t :: Const m (f a)). SApplicative f => Sing t -> Sing (Apply SequenceASym0 t) #

sMapM :: forall a (m0 :: Type -> Type) b (t1 :: a ~> m0 b) (t2 :: Const m a). SMonad m0 => Sing t1 -> Sing t2 -> Sing (Apply (Apply MapMSym0 t1) t2) #

sSequence :: forall (m0 :: Type -> Type) a (t :: Const m (m0 a)). SMonad m0 => Sing t -> Sing (Apply SequenceSym0 t) #

SuppressUnusedWarnings (Pure_6989586621680953757Sym0 :: TyFun a6989586621679962808 (Const m6989586621680952804 a6989586621679962808) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Const

SingI (ConstSym0 :: TyFun a6989586621679095645 (Const a6989586621679095645 b6989586621679095646) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Const

Methods

sing :: Sing ConstSym0 #

SuppressUnusedWarnings (ToEnum_6989586621680953532Sym0 :: TyFun Nat (Const a6989586621680952769 b6989586621680952770) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Const

SuppressUnusedWarnings (FromInteger_6989586621680953634Sym0 :: TyFun Nat (Const a6989586621680952782 b6989586621680952783) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Const

SuppressUnusedWarnings (ShowsPrec_6989586621680953655Sym0 :: TyFun Nat (Const a6989586621680952798 b6989586621680952799 ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Const

SuppressUnusedWarnings (FromString_6989586621681391372Sym0 :: TyFun Symbol (Const a6989586621681391345 b6989586621681391346) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.IsString

SuppressUnusedWarnings (Let6989586621680994974MkConstSym0 :: TyFun k1 (TyFun k2 (TyFun m6989586621680994494 (Const m6989586621680994494 ()) -> Type) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

SuppressUnusedWarnings (ConstSym0 :: TyFun a6989586621679095645 (Const a6989586621679095645 b6989586621679095646) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Const

SuppressUnusedWarnings (TFHelper_6989586621680953780Sym0 :: TyFun (Const m6989586621680952804 (a6989586621679962809 ~> b6989586621679962810)) (Const m6989586621680952804 a6989586621679962809 ~> Const m6989586621680952804 b6989586621679962810) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Const

SuppressUnusedWarnings (TFHelper_6989586621680953642Sym0 :: TyFun (Const a6989586621680952794 b6989586621680952795) (Const a6989586621680952794 b6989586621680952795 ~> Const a6989586621680952794 b6989586621680952795) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Const

SuppressUnusedWarnings (TFHelper_6989586621680953602Sym0 :: TyFun (Const a6989586621680952782 b6989586621680952783) (Const a6989586621680952782 b6989586621680952783 ~> Const a6989586621680952782 b6989586621680952783) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Const

SuppressUnusedWarnings (TFHelper_6989586621680953590Sym0 :: TyFun (Const a6989586621680952782 b6989586621680952783) (Const a6989586621680952782 b6989586621680952783 ~> Const a6989586621680952782 b6989586621680952783) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Const

SuppressUnusedWarnings (TFHelper_6989586621680953578Sym0 :: TyFun (Const a6989586621680952782 b6989586621680952783) (Const a6989586621680952782 b6989586621680952783 ~> Const a6989586621680952782 b6989586621680952783) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Const

SuppressUnusedWarnings (Succ_6989586621680953518Sym0 :: TyFun (Const a6989586621680952769 b6989586621680952770) (Const a6989586621680952769 b6989586621680952770) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Const

SuppressUnusedWarnings (Signum_6989586621680953627Sym0 :: TyFun (Const a6989586621680952782 b6989586621680952783) (Const a6989586621680952782 b6989586621680952783) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Const

SuppressUnusedWarnings (Pred_6989586621680953525Sym0 :: TyFun (Const a6989586621680952769 b6989586621680952770) (Const a6989586621680952769 b6989586621680952770) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Const

SuppressUnusedWarnings (Negate_6989586621680953613Sym0 :: TyFun (Const a6989586621680952782 b6989586621680952783) (Const a6989586621680952782 b6989586621680952783) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Const

SuppressUnusedWarnings (GetConstSym0 :: TyFun (Const a6989586621680951409 b6989586621680951410) a6989586621680951409 -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Const

SuppressUnusedWarnings (FromEnum_6989586621680953539Sym0 :: TyFun (Const a6989586621680952769 b6989586621680952770) Nat -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Const

SuppressUnusedWarnings (EnumFromTo_6989586621680953547Sym0 :: TyFun (Const a6989586621680952769 b6989586621680952770) (Const a6989586621680952769 b6989586621680952770 ~> [Const a6989586621680952769 b6989586621680952770]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Const

SuppressUnusedWarnings (EnumFromThenTo_6989586621680953560Sym0 :: TyFun (Const a6989586621680952769 b6989586621680952770) (Const a6989586621680952769 b6989586621680952770 ~> (Const a6989586621680952769 b6989586621680952770 ~> [Const a6989586621680952769 b6989586621680952770])) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Const

SuppressUnusedWarnings (Compare_6989586621680953507Sym0 :: TyFun (Const a6989586621680952767 b6989586621680952768) (Const a6989586621680952767 b6989586621680952768 ~> Ordering) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Const

SuppressUnusedWarnings (Abs_6989586621680953620Sym0 :: TyFun (Const a6989586621680952782 b6989586621680952783) (Const a6989586621680952782 b6989586621680952783) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Const

SuppressUnusedWarnings (Let6989586621680994982Scrutinee_6989586621680994598Sym0 :: TyFun (a6989586621680988964 ~> b6989586621679941602) (TyFun (t6989586621680988962 a6989586621680988964) (Const b6989586621679941602 (t6989586621680988962 ())) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

SuppressUnusedWarnings (Foldr_6989586621680953731Sym0 :: TyFun (a6989586621680742385 ~> (b6989586621680742386 ~> b6989586621680742386)) (b6989586621680742386 ~> (Const m6989586621680952803 a6989586621680742385 ~> b6989586621680742386)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Const

SuppressUnusedWarnings (FoldMap_6989586621680953711Sym0 :: TyFun (a6989586621680742384 ~> m6989586621680742383) (Const m6989586621680952803 a6989586621680742384 ~> m6989586621680742383) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Const

SuppressUnusedWarnings (Fmap_6989586621680953673Sym0 :: TyFun (a6989586621679962803 ~> b6989586621679962804) (Const m6989586621680952802 a6989586621679962803 ~> Const m6989586621680952802 b6989586621679962804) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Const

SuppressUnusedWarnings (Let6989586621680994982Scrutinee_6989586621680994598Sym1 f6989586621680994972 :: TyFun (t6989586621680988962 a6989586621680988964) (Const b6989586621679941602 (t6989586621680988962 ())) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

SuppressUnusedWarnings (Let6989586621680994974MkConstSym1 f6989586621680994972 :: TyFun k2 (TyFun m6989586621680994494 (Const m6989586621680994494 ()) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

SuppressUnusedWarnings (TFHelper_6989586621680953692Sym0 :: TyFun a6989586621679962805 (Const m6989586621680952802 b6989586621679962806 ~> Const m6989586621680952802 a6989586621679962805) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Const

SuppressUnusedWarnings (Foldr_6989586621680953731Sym1 a6989586621680953728 m6989586621680952803 :: TyFun b6989586621680742386 (Const m6989586621680952803 a6989586621680742385 ~> b6989586621680742386) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Const

SuppressUnusedWarnings (TFHelper_6989586621680953780Sym1 a6989586621680953778 :: TyFun (Const m6989586621680952804 a6989586621679962809) (Const m6989586621680952804 b6989586621679962810) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Const

SuppressUnusedWarnings (FoldMap_6989586621680953711Sym1 a6989586621680953709 m6989586621680952803 :: TyFun (Const m6989586621680952803 a6989586621680742384) m6989586621680742383 -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Const

SuppressUnusedWarnings (Fmap_6989586621680953673Sym1 a6989586621680953671 m6989586621680952802 :: TyFun (Const m6989586621680952802 a6989586621679962803) (Const m6989586621680952802 b6989586621679962804) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Const

SuppressUnusedWarnings (TFHelper_6989586621680953642Sym1 a6989586621680953640 :: TyFun (Const a6989586621680952794 b6989586621680952795) (Const a6989586621680952794 b6989586621680952795) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Const

SuppressUnusedWarnings (TFHelper_6989586621680953602Sym1 a6989586621680953600 :: TyFun (Const a6989586621680952782 b6989586621680952783) (Const a6989586621680952782 b6989586621680952783) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Const

SuppressUnusedWarnings (TFHelper_6989586621680953590Sym1 a6989586621680953588 :: TyFun (Const a6989586621680952782 b6989586621680952783) (Const a6989586621680952782 b6989586621680952783) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Const

SuppressUnusedWarnings (TFHelper_6989586621680953578Sym1 a6989586621680953576 :: TyFun (Const a6989586621680952782 b6989586621680952783) (Const a6989586621680952782 b6989586621680952783) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Const

SuppressUnusedWarnings (ShowsPrec_6989586621680953655Sym1 a6989586621680953652 a6989586621680952798 b6989586621680952799 :: TyFun (Const a6989586621680952798 b6989586621680952799) (Symbol ~> Symbol) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Const

SuppressUnusedWarnings (EnumFromTo_6989586621680953547Sym1 a6989586621680953545 :: TyFun (Const a6989586621680952769 b6989586621680952770) [Const a6989586621680952769 b6989586621680952770] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Const

SuppressUnusedWarnings (EnumFromThenTo_6989586621680953560Sym1 a6989586621680953557 :: TyFun (Const a6989586621680952769 b6989586621680952770) (Const a6989586621680952769 b6989586621680952770 ~> [Const a6989586621680952769 b6989586621680952770]) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Const

SuppressUnusedWarnings (Compare_6989586621680953507Sym1 a6989586621680953505 :: TyFun (Const a6989586621680952767 b6989586621680952768) Ordering -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Const

SuppressUnusedWarnings (Traverse_6989586621680995125Sym0 :: TyFun (a6989586621680988964 ~> f6989586621680988963 b6989586621680988965) (Const m6989586621680994523 a6989586621680988964 ~> f6989586621680988963 (Const m6989586621680994523 b6989586621680988965)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

SuppressUnusedWarnings (LiftA2_6989586621680953765Sym0 :: TyFun (a6989586621679962811 ~> (b6989586621679962812 ~> c6989586621679962813)) (Const m6989586621680952804 a6989586621679962811 ~> (Const m6989586621680952804 b6989586621679962812 ~> Const m6989586621680952804 c6989586621679962813)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Const

SuppressUnusedWarnings (Let6989586621680994974MkConstSym2 x6989586621680994973 f6989586621680994972 m6989586621680994494 :: TyFun m6989586621680994494 (Const m6989586621680994494 ()) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

SuppressUnusedWarnings (Traverse_6989586621680995125Sym1 a6989586621680995123 m6989586621680994523 :: TyFun (Const m6989586621680994523 a6989586621680988964) (f6989586621680988963 (Const m6989586621680994523 b6989586621680988965)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

SuppressUnusedWarnings (LiftA2_6989586621680953765Sym1 a6989586621680953762 m6989586621680952804 :: TyFun (Const m6989586621680952804 a6989586621679962811) (Const m6989586621680952804 b6989586621679962812 ~> Const m6989586621680952804 c6989586621679962813) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Const

SuppressUnusedWarnings (Foldr_6989586621680953731Sym2 a6989586621680953729 a6989586621680953728 m6989586621680952803 :: TyFun (Const m6989586621680952803 a6989586621680742385) b6989586621680742386 -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Const

SuppressUnusedWarnings (TFHelper_6989586621680953692Sym1 a6989586621680953690 m6989586621680952802 b6989586621679962806 :: TyFun (Const m6989586621680952802 b6989586621679962806) (Const m6989586621680952802 a6989586621679962805) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Const

SuppressUnusedWarnings (EnumFromThenTo_6989586621680953560Sym2 a6989586621680953558 a6989586621680953557 :: TyFun (Const a6989586621680952769 b6989586621680952770) [Const a6989586621680952769 b6989586621680952770] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Const

SuppressUnusedWarnings (LiftA2_6989586621680953765Sym2 a6989586621680953763 a6989586621680953762 :: TyFun (Const m6989586621680952804 b6989586621679962812) (Const m6989586621680952804 c6989586621679962813) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Const

Bounded a => Bounded (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Methods

minBound :: Const a b #

maxBound :: Const a b #

Enum a => Enum (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Methods

succ :: Const a b -> Const a b #

pred :: Const a b -> Const a b #

toEnum :: Int -> Const a b #

fromEnum :: Const a b -> Int #

enumFrom :: Const a b -> [Const a b] #

enumFromThen :: Const a b -> Const a b -> [Const a b] #

enumFromTo :: Const a b -> Const a b -> [Const a b] #

enumFromThenTo :: Const a b -> Const a b -> Const a b -> [Const a b] #

Eq a => Eq (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Methods

(==) :: Const a b -> Const a b -> Bool #

(/=) :: Const a b -> Const a b -> Bool #

Floating a => Floating (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Methods

pi :: Const a b #

exp :: Const a b -> Const a b #

log :: Const a b -> Const a b #

sqrt :: Const a b -> Const a b #

(**) :: Const a b -> Const a b -> Const a b #

logBase :: Const a b -> Const a b -> Const a b #

sin :: Const a b -> Const a b #

cos :: Const a b -> Const a b #

tan :: Const a b -> Const a b #

asin :: Const a b -> Const a b #

acos :: Const a b -> Const a b #

atan :: Const a b -> Const a b #

sinh :: Const a b -> Const a b #

cosh :: Const a b -> Const a b #

tanh :: Const a b -> Const a b #

asinh :: Const a b -> Const a b #

acosh :: Const a b -> Const a b #

atanh :: Const a b -> Const a b #

log1p :: Const a b -> Const a b #

expm1 :: Const a b -> Const a b #

log1pexp :: Const a b -> Const a b #

log1mexp :: Const a b -> Const a b #

Fractional a => Fractional (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 #

recip :: Const a b -> Const a b #

fromRational :: Rational -> Const a b #

Integral a => Integral (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Methods

quot :: Const a b -> Const a b -> Const a b #

rem :: Const a b -> Const a b -> Const a b #

div :: Const a b -> Const a b -> Const a b #

mod :: Const a b -> Const a b -> Const a b #

quotRem :: Const a b -> Const a b -> (Const a b, Const a b) #

divMod :: Const a b -> Const a b -> (Const a b, Const a b) #

toInteger :: Const a b -> Integer #

(Typeable k, Data a, Typeable b) => Data (Const a b)

Since: base-4.10.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b0. Data d => c (d -> b0) -> d -> c b0) -> (forall g. g -> c g) -> Const a b -> c (Const a b) #

gunfold :: (forall b0 r. Data b0 => c (b0 -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Const a b) #

toConstr :: Const a b -> Constr #

dataTypeOf :: Const a b -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Const a b)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Const a b)) #

gmapT :: (forall b0. Data b0 => b0 -> b0) -> Const a b -> Const a b #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Const a b -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Const a b -> r #

gmapQ :: (forall d. Data d => d -> u) -> Const a b -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Const a b -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Const a b -> m (Const a b) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Const a b -> m (Const a b) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Const a b -> m (Const a b) #

Num a => Num (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 #

(*) :: Const a b -> Const a b -> Const a b #

negate :: Const a b -> Const a b #

abs :: Const a b -> Const a b #

signum :: Const a b -> Const a b #

fromInteger :: Integer -> Const a b #

Ord a => Ord (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Methods

compare :: Const a b -> Const a b -> Ordering #

(<) :: Const a b -> Const a b -> Bool #

(<=) :: Const a b -> Const a b -> Bool #

(>) :: Const a b -> Const a b -> Bool #

(>=) :: Const a b -> Const a b -> Bool #

max :: Const a b -> Const a b -> Const a b #

min :: Const a b -> Const a b -> Const a b #

Read a => Read (Const a b)

This instance would be equivalent to the derived instances of the Const newtype if the getConst field were removed

Since: base-4.8.0.0

Instance details

Defined in Data.Functor.Const

Real a => Real (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Methods

toRational :: Const a b -> Rational #

RealFloat a => RealFloat (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Methods

floatRadix :: Const a b -> Integer #

floatDigits :: Const a b -> Int #

floatRange :: Const a b -> (Int, Int) #

decodeFloat :: Const a b -> (Integer, Int) #

encodeFloat :: Integer -> Int -> Const a b #

exponent :: Const a b -> Int #

significand :: Const a b -> Const a b #

scaleFloat :: Int -> Const a b -> Const a b #

isNaN :: Const a b -> Bool #

isInfinite :: Const a b -> Bool #

isDenormalized :: Const a b -> Bool #

isNegativeZero :: Const a b -> Bool #

isIEEE :: Const a b -> Bool #

atan2 :: Const a b -> Const a b -> Const a b #

RealFrac a => RealFrac (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Methods

properFraction :: Integral b0 => Const a b -> (b0, Const a b) #

truncate :: Integral b0 => Const a b -> b0 #

round :: Integral b0 => Const a b -> b0 #

ceiling :: Integral b0 => Const a b -> b0 #

floor :: Integral b0 => Const a b -> b0 #

Show a => Show (Const a b)

This instance would be equivalent to the derived instances of the Const newtype if the getConst field were removed

Since: base-4.8.0.0

Instance details

Defined in Data.Functor.Const

Methods

showsPrec :: Int -> Const a b -> ShowS #

show :: Const a b -> String #

showList :: [Const a b] -> ShowS #

Ix a => Ix (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Methods

range :: (Const a b, Const a b) -> [Const a b] #

index :: (Const a b, Const a b) -> Const a b -> Int #

unsafeIndex :: (Const a b, Const a b) -> Const a b -> Int #

inRange :: (Const a b, Const a b) -> Const a b -> Bool #

rangeSize :: (Const a b, Const a b) -> Int #

unsafeRangeSize :: (Const a b, Const a b) -> Int #

IsString a => IsString (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.String

Methods

fromString :: String -> Const a b #

Generic (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Associated Types

type Rep (Const a b) :: Type -> Type #

Methods

from :: Const a b -> Rep (Const a b) x #

to :: Rep (Const a b) x -> Const a b #

Semigroup a => Semigroup (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 #

sconcat :: NonEmpty (Const a b) -> Const a b #

stimes :: Integral b0 => b0 -> Const a b -> Const a b #

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 #

Hashable a => Hashable (Const a b) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Const a b -> Int #

hash :: Const a b -> Int #

Storable a => Storable (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Methods

sizeOf :: Const a b -> Int #

alignment :: Const a b -> Int #

peekElemOff :: Ptr (Const a b) -> Int -> IO (Const a b) #

pokeElemOff :: Ptr (Const a b) -> Int -> Const a b -> IO () #

peekByteOff :: Ptr b0 -> Int -> IO (Const a b) #

pokeByteOff :: Ptr b0 -> Int -> Const a b -> IO () #

peek :: Ptr (Const a b) -> IO (Const a b) #

poke :: Ptr (Const a b) -> Const a b -> IO () #

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 #

FiniteBits a => FiniteBits (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

NFData a => NFData (Const a b)

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Const a b -> () #

Unbox a => Unbox (Const a b) 
Instance details

Defined in Data.Vector.Unboxed.Base

Wrapped (Const a x) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (Const a x) #

Methods

_Wrapped' :: Iso' (Const a x) (Unwrapped (Const a x)) #

Container (Const a b) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element (Const a b) #

Methods

toList :: Const a b -> [Element (Const a b)] #

null :: Const a b -> Bool #

foldr :: (Element (Const a b) -> b0 -> b0) -> b0 -> Const a b -> b0 #

foldl :: (b0 -> Element (Const a b) -> b0) -> b0 -> Const a b -> b0 #

foldl' :: (b0 -> Element (Const a b) -> b0) -> b0 -> Const a b -> b0 #

length :: Const a b -> Int #

elem :: Element (Const a b) -> Const a b -> Bool #

maximum :: Const a b -> Element (Const a b) #

minimum :: Const a b -> Element (Const a b) #

foldMap :: Monoid m => (Element (Const a b) -> m) -> Const a b -> m #

fold :: Const a b -> Element (Const a b) #

foldr' :: (Element (Const a b) -> b0 -> b0) -> b0 -> Const a b -> b0 #

foldr1 :: (Element (Const a b) -> Element (Const a b) -> Element (Const a b)) -> Const a b -> Element (Const a b) #

foldl1 :: (Element (Const a b) -> Element (Const a b) -> Element (Const a b)) -> Const a b -> Element (Const a b) #

notElem :: Element (Const a b) -> Const a b -> Bool #

all :: (Element (Const a b) -> Bool) -> Const a b -> Bool #

any :: (Element (Const a b) -> Bool) -> Const a b -> Bool #

and :: Const a b -> Bool #

or :: Const a b -> Bool #

find :: (Element (Const a b) -> Bool) -> Const a b -> Maybe (Element (Const a b)) #

safeHead :: Const a b -> Maybe (Element (Const a b)) #

PIsString (Const a b) 
Instance details

Defined in Data.Singletons.Prelude.IsString

Associated Types

type FromString arg0 :: a0 #

SIsString a => SIsString (Const a b) 
Instance details

Defined in Data.Singletons.Prelude.IsString

Methods

sFromString :: forall (t :: Symbol). Sing t -> Sing (Apply FromStringSym0 t) #

t ~ Const a' x' => Rewrapped (Const a x) t 
Instance details

Defined in Control.Lens.Wrapped

SDecide a => TestCoercion (SConst :: Const a b -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Const

Methods

testCoercion :: forall (a0 :: k) (b0 :: k). SConst a0 -> SConst b0 -> Maybe (Coercion a0 b0) #

SDecide a => TestEquality (SConst :: Const a b -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Const

Methods

testEquality :: forall (a0 :: k) (b0 :: k). SConst a0 -> SConst b0 -> Maybe (a0 :~: b0) #

type MapM (arg1 :: a0 ~> m0 b0) (arg2 :: Const m a0) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type MapM (arg1 :: a0 ~> m0 b0) (arg2 :: Const m a0) = Apply (Apply (MapM_6989586621680989011Sym0 :: TyFun (a0 ~> m0 b0) (Const m a0 ~> m0 (Const m b0)) -> Type) arg1) arg2
type Traverse (a1 :: a6989586621680988964 ~> f6989586621680988963 b6989586621680988965) (a2 :: Const m a6989586621680988964) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type Traverse (a1 :: a6989586621680988964 ~> f6989586621680988963 b6989586621680988965) (a2 :: Const m a6989586621680988964) = Apply (Apply (Traverse_6989586621680995125Sym0 :: TyFun (a6989586621680988964 ~> f6989586621680988963 b6989586621680988965) (Const m a6989586621680988964 ~> f6989586621680988963 (Const m b6989586621680988965)) -> Type) a1) a2
type LiftA2 (a1 :: a6989586621679962811 ~> (b6989586621679962812 ~> c6989586621679962813)) (a2 :: Const m a6989586621679962811) (a3 :: Const m b6989586621679962812) 
Instance details

Defined in Data.Singletons.Prelude.Const

type LiftA2 (a1 :: a6989586621679962811 ~> (b6989586621679962812 ~> c6989586621679962813)) (a2 :: Const m a6989586621679962811) (a3 :: Const m b6989586621679962812) = Apply (Apply (Apply (LiftA2_6989586621680953765Sym0 :: TyFun (a6989586621679962811 ~> (b6989586621679962812 ~> c6989586621679962813)) (Const m a6989586621679962811 ~> (Const m b6989586621679962812 ~> Const m c6989586621679962813)) -> Type) a1) a2) a3
type FoldMap (a1 :: a6989586621680742384 ~> k2) (a2 :: Const m a6989586621680742384) 
Instance details

Defined in Data.Singletons.Prelude.Const

type FoldMap (a1 :: a6989586621680742384 ~> k2) (a2 :: Const m a6989586621680742384) = Apply (Apply (FoldMap_6989586621680953711Sym0 :: TyFun (a6989586621680742384 ~> k2) (Const m a6989586621680742384 ~> k2) -> Type) a1) a2
type Fmap (a1 :: a6989586621679962803 ~> b6989586621679962804) (a2 :: Const m a6989586621679962803) 
Instance details

Defined in Data.Singletons.Prelude.Const

type Fmap (a1 :: a6989586621679962803 ~> b6989586621679962804) (a2 :: Const m a6989586621679962803) = Apply (Apply (Fmap_6989586621680953673Sym0 :: TyFun (a6989586621679962803 ~> b6989586621679962804) (Const m a6989586621679962803 ~> Const m b6989586621679962804) -> Type) a1) a2
type Foldl' (arg1 :: b0 ~> (a0 ~> b0)) (arg2 :: b0) (arg3 :: Const m a0) 
Instance details

Defined in Data.Singletons.Prelude.Const

type Foldl' (arg1 :: b0 ~> (a0 ~> b0)) (arg2 :: b0) (arg3 :: Const m a0) = Apply (Apply (Apply (Foldl'_6989586621680743162Sym0 :: TyFun (b0 ~> (a0 ~> b0)) (b0 ~> (Const m a0 ~> b0)) -> Type) arg1) arg2) arg3
type Foldl (arg1 :: b0 ~> (a0 ~> b0)) (arg2 :: b0) (arg3 :: Const m a0) 
Instance details

Defined in Data.Singletons.Prelude.Const

type Foldl (arg1 :: b0 ~> (a0 ~> b0)) (arg2 :: b0) (arg3 :: Const m a0) = Apply (Apply (Apply (Foldl_6989586621680743137Sym0 :: TyFun (b0 ~> (a0 ~> b0)) (b0 ~> (Const m a0 ~> b0)) -> Type) arg1) arg2) arg3
type Foldr' (arg1 :: a0 ~> (b0 ~> b0)) (arg2 :: b0) (arg3 :: Const m a0) 
Instance details

Defined in Data.Singletons.Prelude.Const

type Foldr' (arg1 :: a0 ~> (b0 ~> b0)) (arg2 :: b0) (arg3 :: Const m a0) = Apply (Apply (Apply (Foldr'_6989586621680743107Sym0 :: TyFun (a0 ~> (b0 ~> b0)) (b0 ~> (Const m a0 ~> b0)) -> Type) arg1) arg2) arg3
type Foldr (a1 :: a6989586621680742385 ~> (k2 ~> k2)) (a2 :: k2) (a3 :: Const m a6989586621680742385) 
Instance details

Defined in Data.Singletons.Prelude.Const

type Foldr (a1 :: a6989586621680742385 ~> (k2 ~> k2)) (a2 :: k2) (a3 :: Const m a6989586621680742385) = Apply (Apply (Apply (Foldr_6989586621680953731Sym0 :: TyFun (a6989586621680742385 ~> (k2 ~> k2)) (k2 ~> (Const m a6989586621680742385 ~> k2)) -> Type) a1) a2) a3
type Rep1 (Const a :: k -> Type) 
Instance details

Defined in Data.Functor.Const

type Rep1 (Const a :: k -> Type) = D1 ('MetaData "Const" "Data.Functor.Const" "base" 'True) (C1 ('MetaCons "Const" 'PrefixI 'True) (S1 ('MetaSel ('Just "getConst") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a)))
type Pure (a :: k1) 
Instance details

Defined in Data.Singletons.Prelude.Const

type Pure (a :: k1) = Apply (Pure_6989586621680953757Sym0 :: TyFun k1 (Const m k1) -> Type) a
type Elem (arg1 :: a0) (arg2 :: Const m a0) 
Instance details

Defined in Data.Singletons.Prelude.Const

type Elem (arg1 :: a0) (arg2 :: Const m a0) = Apply (Apply (Elem_6989586621680743293Sym0 :: TyFun a0 (Const m a0 ~> Bool) -> Type) arg1) arg2
type Foldl1 (arg1 :: a0 ~> (a0 ~> a0)) (arg2 :: Const m a0) 
Instance details

Defined in Data.Singletons.Prelude.Const

type Foldl1 (arg1 :: a0 ~> (a0 ~> a0)) (arg2 :: Const m a0) = Apply (Apply (Foldl1_6989586621680743216Sym0 :: TyFun (a0 ~> (a0 ~> a0)) (Const m a0 ~> a0) -> Type) arg1) arg2
type Foldr1 (arg1 :: a0 ~> (a0 ~> a0)) (arg2 :: Const m a0) 
Instance details

Defined in Data.Singletons.Prelude.Const

type Foldr1 (arg1 :: a0 ~> (a0 ~> a0)) (arg2 :: Const m a0) = Apply (Apply (Foldr1_6989586621680743191Sym0 :: TyFun (a0 ~> (a0 ~> a0)) (Const m a0 ~> a0) -> Type) arg1) arg2
type (a1 :: k1) <$ (a2 :: Const m b6989586621679962806) 
Instance details

Defined in Data.Singletons.Prelude.Const

type (a1 :: k1) <$ (a2 :: Const m b6989586621679962806) = Apply (Apply (TFHelper_6989586621680953692Sym0 :: TyFun k1 (Const m b6989586621679962806 ~> Const m k1) -> Type) a1) a2
type Apply (ShowsPrec_6989586621680953655Sym0 :: TyFun Nat (Const a6989586621680952798 b6989586621680952799 ~> (Symbol ~> Symbol)) -> Type) (a6989586621680953652 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Const

type Apply (ShowsPrec_6989586621680953655Sym0 :: TyFun Nat (Const a6989586621680952798 b6989586621680952799 ~> (Symbol ~> Symbol)) -> Type) (a6989586621680953652 :: Nat) = ShowsPrec_6989586621680953655Sym1 a6989586621680953652 a6989586621680952798 b6989586621680952799 :: TyFun (Const a6989586621680952798 b6989586621680952799) (Symbol ~> Symbol) -> Type
type Apply (Let6989586621680994974MkConstSym0 :: TyFun k1 (TyFun k2 (TyFun m6989586621680994494 (Const m6989586621680994494 ()) -> Type) -> Type) -> Type) (f6989586621680994972 :: k1) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type Apply (Let6989586621680994974MkConstSym0 :: TyFun k1 (TyFun k2 (TyFun m6989586621680994494 (Const m6989586621680994494 ()) -> Type) -> Type) -> Type) (f6989586621680994972 :: k1) = Let6989586621680994974MkConstSym1 f6989586621680994972 :: TyFun k2 (TyFun m6989586621680994494 (Const m6989586621680994494 ()) -> Type) -> Type
type Apply (Let6989586621680994974MkConstSym1 f6989586621680994972 :: TyFun k2 (TyFun m6989586621680994494 (Const m6989586621680994494 ()) -> Type) -> Type) (x6989586621680994973 :: k2) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type Apply (Let6989586621680994974MkConstSym1 f6989586621680994972 :: TyFun k2 (TyFun m6989586621680994494 (Const m6989586621680994494 ()) -> Type) -> Type) (x6989586621680994973 :: k2) = Let6989586621680994974MkConstSym2 f6989586621680994972 x6989586621680994973 m6989586621680994494 :: TyFun m6989586621680994494 (Const m6989586621680994494 ()) -> Type
type Apply (TFHelper_6989586621680953692Sym0 :: TyFun a6989586621679962805 (Const m6989586621680952802 b6989586621679962806 ~> Const m6989586621680952802 a6989586621679962805) -> Type) (a6989586621680953690 :: a6989586621679962805) 
Instance details

Defined in Data.Singletons.Prelude.Const

type Apply (TFHelper_6989586621680953692Sym0 :: TyFun a6989586621679962805 (Const m6989586621680952802 b6989586621679962806 ~> Const m6989586621680952802 a6989586621679962805) -> Type) (a6989586621680953690 :: a6989586621679962805) = TFHelper_6989586621680953692Sym1 a6989586621680953690 m6989586621680952802 b6989586621679962806 :: TyFun (Const m6989586621680952802 b6989586621679962806) (Const m6989586621680952802 a6989586621679962805) -> Type
type Apply (Foldr_6989586621680953731Sym1 a6989586621680953728 m6989586621680952803 :: TyFun b6989586621680742386 (Const m6989586621680952803 a6989586621680742385 ~> b6989586621680742386) -> Type) (a6989586621680953729 :: b6989586621680742386) 
Instance details

Defined in Data.Singletons.Prelude.Const

type Apply (Foldr_6989586621680953731Sym1 a6989586621680953728 m6989586621680952803 :: TyFun b6989586621680742386 (Const m6989586621680952803 a6989586621680742385 ~> b6989586621680742386) -> Type) (a6989586621680953729 :: b6989586621680742386) = Foldr_6989586621680953731Sym2 a6989586621680953728 a6989586621680953729 m6989586621680952803 :: TyFun (Const m6989586621680952803 a6989586621680742385) b6989586621680742386 -> Type
newtype MVector s (Const a b) 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype MVector s (Const a b) = MV_Const (MVector s a)
type Apply (Pure_6989586621680953757Sym0 :: TyFun a (Const m6989586621680952804 a) -> Type) (a6989586621680953756 :: a) 
Instance details

Defined in Data.Singletons.Prelude.Const

type Apply (Pure_6989586621680953757Sym0 :: TyFun a (Const m6989586621680952804 a) -> Type) (a6989586621680953756 :: a) = Pure_6989586621680953757 a6989586621680953756 :: Const m6989586621680952804 a
type Apply (ToEnum_6989586621680953532Sym0 :: TyFun Nat (Const a6989586621680952769 b6989586621680952770) -> Type) (a6989586621680953531 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Const

type Apply (ToEnum_6989586621680953532Sym0 :: TyFun Nat (Const a6989586621680952769 b6989586621680952770) -> Type) (a6989586621680953531 :: Nat) = ToEnum_6989586621680953532 a6989586621680953531 :: Const a6989586621680952769 b6989586621680952770
type Apply (FromInteger_6989586621680953634Sym0 :: TyFun Nat (Const a6989586621680952782 b6989586621680952783) -> Type) (a6989586621680953633 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Const

type Apply (FromInteger_6989586621680953634Sym0 :: TyFun Nat (Const a6989586621680952782 b6989586621680952783) -> Type) (a6989586621680953633 :: Nat) = FromInteger_6989586621680953634 a6989586621680953633 :: Const a6989586621680952782 b6989586621680952783
type Apply (FromString_6989586621681391372Sym0 :: TyFun Symbol (Const a6989586621681391345 b6989586621681391346) -> Type) (a6989586621681391371 :: Symbol) 
Instance details

Defined in Data.Singletons.Prelude.IsString

type Apply (FromString_6989586621681391372Sym0 :: TyFun Symbol (Const a6989586621681391345 b6989586621681391346) -> Type) (a6989586621681391371 :: Symbol) = FromString_6989586621681391372 a6989586621681391371 :: Const a6989586621681391345 b6989586621681391346
type Apply (ConstSym0 :: TyFun a (Const a b6989586621679095646) -> Type) (t6989586621680951129 :: a) 
Instance details

Defined in Data.Singletons.Prelude.Const

type Apply (ConstSym0 :: TyFun a (Const a b6989586621679095646) -> Type) (t6989586621680951129 :: a) = 'Const t6989586621680951129 :: Const a b6989586621679095646
type Apply (Let6989586621680994974MkConstSym2 x6989586621680994973 f6989586621680994972 m :: TyFun m (Const m ()) -> Type) (a6989586621680994977 :: m) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type Apply (Let6989586621680994974MkConstSym2 x6989586621680994973 f6989586621680994972 m :: TyFun m (Const m ()) -> Type) (a6989586621680994977 :: m) = Let6989586621680994974MkConst x6989586621680994973 f6989586621680994972 a6989586621680994977
type Apply (Let6989586621680994982Scrutinee_6989586621680994598Sym1 f6989586621680994972 :: TyFun (t6989586621680988962 a6989586621680988964) (Const b6989586621679941602 (t6989586621680988962 ())) -> Type) (x6989586621680994973 :: t6989586621680988962 a6989586621680988964) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type Apply (Let6989586621680994982Scrutinee_6989586621680994598Sym1 f6989586621680994972 :: TyFun (t6989586621680988962 a6989586621680988964) (Const b6989586621679941602 (t6989586621680988962 ())) -> Type) (x6989586621680994973 :: t6989586621680988962 a6989586621680988964) = Let6989586621680994982Scrutinee_6989586621680994598 f6989586621680994972 x6989586621680994973
type Product (arg0 :: Const m a0) 
Instance details

Defined in Data.Singletons.Prelude.Const

type Product (arg0 :: Const m a0) = Apply (Product_6989586621680743347Sym0 :: TyFun (Const m a0) a0 -> Type) arg0
type Sum (arg0 :: Const m a0) 
Instance details

Defined in Data.Singletons.Prelude.Const

type Sum (arg0 :: Const m a0) = Apply (Sum_6989586621680743334Sym0 :: TyFun (Const m a0) a0 -> Type) arg0
type Minimum (arg0 :: Const m a0) 
Instance details

Defined in Data.Singletons.Prelude.Const

type Minimum (arg0 :: Const m a0) = Apply (Minimum_6989586621680743321Sym0 :: TyFun (Const m a0) a0 -> Type) arg0
type Maximum (arg0 :: Const m a0) 
Instance details

Defined in Data.Singletons.Prelude.Const

type Maximum (arg0 :: Const m a0) = Apply (Maximum_6989586621680743308Sym0 :: TyFun (Const m a0) a0 -> Type) arg0
type Length (arg0 :: Const m a0) 
Instance details

Defined in Data.Singletons.Prelude.Const

type Length (arg0 :: Const m a0) = Apply (Length_6989586621680743270Sym0 :: TyFun (Const m a0) Nat -> Type) arg0
type Null (arg0 :: Const m a0) 
Instance details

Defined in Data.Singletons.Prelude.Const

type Null (arg0 :: Const m a0) = Apply (Null_6989586621680743249Sym0 :: TyFun (Const m a0) Bool -> Type) arg0
type ToList (arg0 :: Const m a0) 
Instance details

Defined in Data.Singletons.Prelude.Const

type ToList (arg0 :: Const m a0) = Apply (ToList_6989586621680743240Sym0 :: TyFun (Const m a0) [a0] -> Type) arg0
type Fold (arg0 :: Const m m0) 
Instance details

Defined in Data.Singletons.Prelude.Const

type Fold (arg0 :: Const m m0) = Apply (Fold_6989586621680743057Sym0 :: TyFun (Const m m0) m0 -> Type) arg0
type Sequence (arg0 :: Const m (m0 a0)) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type Sequence (arg0 :: Const m (m0 a0)) = Apply (Sequence_6989586621680989026Sym0 :: TyFun (Const m (m0 a0)) (m0 (Const m a0)) -> Type) arg0
type SequenceA (arg0 :: Const m (f0 a0)) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type SequenceA (arg0 :: Const m (f0 a0)) = Apply (SequenceA_6989586621680989001Sym0 :: TyFun (Const m (f0 a0)) (f0 (Const m a0)) -> Type) arg0
type (arg1 :: Const m a0) <* (arg2 :: Const m b0) 
Instance details

Defined in Data.Singletons.Prelude.Const

type (arg1 :: Const m a0) <* (arg2 :: Const m b0) = Apply (Apply (TFHelper_6989586621679963287Sym0 :: TyFun (Const m a0) (Const m b0 ~> Const m a0) -> Type) arg1) arg2
type (arg1 :: Const m a0) *> (arg2 :: Const m b0) 
Instance details

Defined in Data.Singletons.Prelude.Const

type (arg1 :: Const m a0) *> (arg2 :: Const m b0) = Apply (Apply (TFHelper_6989586621679963275Sym0 :: TyFun (Const m a0) (Const m b0 ~> Const m b0) -> Type) arg1) arg2
type (a1 :: Const m (a6989586621679962809 ~> b6989586621679962810)) <*> (a2 :: Const m a6989586621679962809) 
Instance details

Defined in Data.Singletons.Prelude.Const

type (a1 :: Const m (a6989586621679962809 ~> b6989586621679962810)) <*> (a2 :: Const m a6989586621679962809) = Apply (Apply (TFHelper_6989586621680953780Sym0 :: TyFun (Const m (a6989586621679962809 ~> b6989586621679962810)) (Const m a6989586621679962809 ~> Const m b6989586621679962810) -> Type) a1) a2
type Apply (Let6989586621680994982Scrutinee_6989586621680994598Sym0 :: TyFun (a6989586621680988964 ~> b6989586621679941602) (TyFun (t6989586621680988962 a6989586621680988964) (Const b6989586621679941602 (t6989586621680988962 ())) -> Type) -> Type) (f6989586621680994972 :: a6989586621680988964 ~> b6989586621679941602) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type Apply (Let6989586621680994982Scrutinee_6989586621680994598Sym0 :: TyFun (a6989586621680988964 ~> b6989586621679941602) (TyFun (t6989586621680988962 a6989586621680988964) (Const b6989586621679941602 (t6989586621680988962 ())) -> Type) -> Type) (f6989586621680994972 :: a6989586621680988964 ~> b6989586621679941602) = Let6989586621680994982Scrutinee_6989586621680994598Sym1 f6989586621680994972 :: TyFun (t6989586621680988962 a6989586621680988964) (Const b6989586621679941602 (t6989586621680988962 ())) -> Type
type Apply (Fmap_6989586621680953673Sym0 :: TyFun (a6989586621679962803 ~> b6989586621679962804) (Const m6989586621680952802 a6989586621679962803 ~> Const m6989586621680952802 b6989586621679962804) -> Type) (a6989586621680953671 :: a6989586621679962803 ~> b6989586621679962804) 
Instance details

Defined in Data.Singletons.Prelude.Const

type Apply (Fmap_6989586621680953673Sym0 :: TyFun (a6989586621679962803 ~> b6989586621679962804) (Const m6989586621680952802 a6989586621679962803 ~> Const m6989586621680952802 b6989586621679962804) -> Type) (a6989586621680953671 :: a6989586621679962803 ~> b6989586621679962804) = Fmap_6989586621680953673Sym1 a6989586621680953671 m6989586621680952802 :: TyFun (Const m6989586621680952802 a6989586621679962803) (Const m6989586621680952802 b6989586621679962804) -> Type
type Apply (FoldMap_6989586621680953711Sym0 :: TyFun (a6989586621680742384 ~> m6989586621680742383) (Const m6989586621680952803 a6989586621680742384 ~> m6989586621680742383) -> Type) (a6989586621680953709 :: a6989586621680742384 ~> m6989586621680742383) 
Instance details

Defined in Data.Singletons.Prelude.Const

type Apply (FoldMap_6989586621680953711Sym0 :: TyFun (a6989586621680742384 ~> m6989586621680742383) (Const m6989586621680952803 a6989586621680742384 ~> m6989586621680742383) -> Type) (a6989586621680953709 :: a6989586621680742384 ~> m6989586621680742383) = FoldMap_6989586621680953711Sym1 a6989586621680953709 m6989586621680952803 :: TyFun (Const m6989586621680952803 a6989586621680742384) m6989586621680742383 -> Type
type Apply (Foldr_6989586621680953731Sym0 :: TyFun (a6989586621680742385 ~> (b6989586621680742386 ~> b6989586621680742386)) (b6989586621680742386 ~> (Const m6989586621680952803 a6989586621680742385 ~> b6989586621680742386)) -> Type) (a6989586621680953728 :: a6989586621680742385 ~> (b6989586621680742386 ~> b6989586621680742386)) 
Instance details

Defined in Data.Singletons.Prelude.Const

type Apply (Foldr_6989586621680953731Sym0 :: TyFun (a6989586621680742385 ~> (b6989586621680742386 ~> b6989586621680742386)) (b6989586621680742386 ~> (Const m6989586621680952803 a6989586621680742385 ~> b6989586621680742386)) -> Type) (a6989586621680953728 :: a6989586621680742385 ~> (b6989586621680742386 ~> b6989586621680742386)) = Foldr_6989586621680953731Sym1 a6989586621680953728 m6989586621680952803 :: TyFun b6989586621680742386 (Const m6989586621680952803 a6989586621680742385 ~> b6989586621680742386) -> Type
type Apply (Traverse_6989586621680995125Sym0 :: TyFun (a6989586621680988964 ~> f6989586621680988963 b6989586621680988965) (Const m6989586621680994523 a6989586621680988964 ~> f6989586621680988963 (Const m6989586621680994523 b6989586621680988965)) -> Type) (a6989586621680995123 :: a6989586621680988964 ~> f6989586621680988963 b6989586621680988965) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type Apply (Traverse_6989586621680995125Sym0 :: TyFun (a6989586621680988964 ~> f6989586621680988963 b6989586621680988965) (Const m6989586621680994523 a6989586621680988964 ~> f6989586621680988963 (Const m6989586621680994523 b6989586621680988965)) -> Type) (a6989586621680995123 :: a6989586621680988964 ~> f6989586621680988963 b6989586621680988965) = Traverse_6989586621680995125Sym1 a6989586621680995123 m6989586621680994523 :: TyFun (Const m6989586621680994523 a6989586621680988964) (f6989586621680988963 (Const m6989586621680994523 b6989586621680988965)) -> Type
type Apply (LiftA2_6989586621680953765Sym0 :: TyFun (a6989586621679962811 ~> (b6989586621679962812 ~> c6989586621679962813)) (Const m6989586621680952804 a6989586621679962811 ~> (Const m6989586621680952804 b6989586621679962812 ~> Const m6989586621680952804 c6989586621679962813)) -> Type) (a6989586621680953762 :: a6989586621679962811 ~> (b6989586621679962812 ~> c6989586621679962813)) 
Instance details

Defined in Data.Singletons.Prelude.Const

type Apply (LiftA2_6989586621680953765Sym0 :: TyFun (a6989586621679962811 ~> (b6989586621679962812 ~> c6989586621679962813)) (Const m6989586621680952804 a6989586621679962811 ~> (Const m6989586621680952804 b6989586621679962812 ~> Const m6989586621680952804 c6989586621679962813)) -> Type) (a6989586621680953762 :: a6989586621679962811 ~> (b6989586621679962812 ~> c6989586621679962813)) = LiftA2_6989586621680953765Sym1 a6989586621680953762 m6989586621680952804 :: TyFun (Const m6989586621680952804 a6989586621679962811) (Const m6989586621680952804 b6989586621679962812 ~> Const m6989586621680952804 c6989586621679962813) -> Type
type Rep (Const a b) 
Instance details

Defined in Data.Functor.Const

type Rep (Const a b) = D1 ('MetaData "Const" "Data.Functor.Const" "base" 'True) (C1 ('MetaCons "Const" 'PrefixI 'True) (S1 ('MetaSel ('Just "getConst") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a)))
newtype Vector (Const a b) 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype Vector (Const a b) = V_Const (Vector a)
type Unwrapped (Const a x) 
Instance details

Defined in Control.Lens.Wrapped

type Unwrapped (Const a x) = a
type Sing 
Instance details

Defined in Data.Singletons.Prelude.Const

type Sing = SConst :: Const a b -> Type
type Element (Const a b) 
Instance details

Defined in Universum.Container.Class

type Element (Const a b) = ElementDefault (Const a b)
type Mempty 
Instance details

Defined in Data.Singletons.Prelude.Const

type Mempty = Mempty_6989586621680953574Sym0 :: Const a b
type MaxBound 
Instance details

Defined in Data.Singletons.Prelude.Const

type MaxBound = MaxBound_6989586621680953503Sym0 :: Const a b
type MinBound 
Instance details

Defined in Data.Singletons.Prelude.Const

type MinBound = MinBound_6989586621680953501Sym0 :: Const a b
type Demote (Const a b) 
Instance details

Defined in Data.Singletons.Prelude.Const

type Demote (Const a b) = Const (Demote a) b
type FromString a2 
Instance details

Defined in Data.Singletons.Prelude.IsString

type FromString a2 = Apply (FromString_6989586621681391372Sym0 :: TyFun Symbol (Const a1 b) -> Type) a2
type Mconcat (arg0 :: [Const a b]) 
Instance details

Defined in Data.Singletons.Prelude.Const

type Mconcat (arg0 :: [Const a b]) = Apply (Mconcat_6989586621680631303Sym0 :: TyFun [Const a b] (Const a b) -> Type) arg0
type Show_ (arg0 :: Const a b) 
Instance details

Defined in Data.Singletons.Prelude.Const

type Show_ (arg0 :: Const a b) = Apply (Show__6989586621680577846Sym0 :: TyFun (Const a b) Symbol -> Type) arg0
type Sconcat (arg0 :: NonEmpty (Const a b)) 
Instance details

Defined in Data.Singletons.Prelude.Const

type Sconcat (arg0 :: NonEmpty (Const a b)) = Apply (Sconcat_6989586621680187691Sym0 :: TyFun (NonEmpty (Const a b)) (Const a b) -> Type) arg0
type FromEnum (a2 :: Const a1 b) 
Instance details

Defined in Data.Singletons.Prelude.Const

type FromEnum (a2 :: Const a1 b) = Apply (FromEnum_6989586621680953539Sym0 :: TyFun (Const a1 b) Nat -> Type) a2
type ToEnum a2 
Instance details

Defined in Data.Singletons.Prelude.Const

type ToEnum a2 = Apply (ToEnum_6989586621680953532Sym0 :: TyFun Nat (Const a1 b) -> Type) a2
type Pred (a2 :: Const a1 b) 
Instance details

Defined in Data.Singletons.Prelude.Const

type Pred (a2 :: Const a1 b) = Apply (Pred_6989586621680953525Sym0 :: TyFun (Const a1 b) (Const a1 b) -> Type) a2
type Succ (a2 :: Const a1 b) 
Instance details

Defined in Data.Singletons.Prelude.Const

type Succ (a2 :: Const a1 b) = Apply (Succ_6989586621680953518Sym0 :: TyFun (Const a1 b) (Const a1 b) -> Type) a2
type FromInteger a2 
Instance details

Defined in Data.Singletons.Prelude.Const

type FromInteger a2 = Apply (FromInteger_6989586621680953634Sym0 :: TyFun Nat (Const a1 b) -> Type) a2
type Signum (a2 :: Const a1 b) 
Instance details

Defined in Data.Singletons.Prelude.Const

type Signum (a2 :: Const a1 b) = Apply (Signum_6989586621680953627Sym0 :: TyFun (Const a1 b) (Const a1 b) -> Type) a2
type Abs (a2 :: Const a1 b) 
Instance details

Defined in Data.Singletons.Prelude.Const

type Abs (a2 :: Const a1 b) = Apply (Abs_6989586621680953620Sym0 :: TyFun (Const a1 b) (Const a1 b) -> Type) a2
type Negate (a2 :: Const a1 b) 
Instance details

Defined in Data.Singletons.Prelude.Const

type Negate (a2 :: Const a1 b) = Apply (Negate_6989586621680953613Sym0 :: TyFun (Const a1 b) (Const a1 b) -> Type) a2
type Mappend (arg1 :: Const a b) (arg2 :: Const a b) 
Instance details

Defined in Data.Singletons.Prelude.Const

type Mappend (arg1 :: Const a b) (arg2 :: Const a b) = Apply (Apply (Mappend_6989586621680631288Sym0 :: TyFun (Const a b) (Const a b ~> Const a b) -> Type) arg1) arg2
type ShowList (arg1 :: [Const a b]) arg2 
Instance details

Defined in Data.Singletons.Prelude.Const

type ShowList (arg1 :: [Const a b]) arg2 = Apply (Apply (ShowList_6989586621680577854Sym0 :: TyFun [Const a b] (Symbol ~> Symbol) -> Type) arg1) arg2
type (a2 :: Const a1 b) <> (a3 :: Const a1 b) 
Instance details

Defined in Data.Singletons.Prelude.Const

type (a2 :: Const a1 b) <> (a3 :: Const a1 b) = Apply (Apply (TFHelper_6989586621680953642Sym0 :: TyFun (Const a1 b) (Const a1 b ~> Const a1 b) -> Type) a2) a3
type EnumFromTo (a2 :: Const a1 b) (a3 :: Const a1 b) 
Instance details

Defined in Data.Singletons.Prelude.Const

type EnumFromTo (a2 :: Const a1 b) (a3 :: Const a1 b) = Apply (Apply (EnumFromTo_6989586621680953547Sym0 :: TyFun (Const a1 b) (Const a1 b ~> [Const a1 b]) -> Type) a2) a3
type (a2 :: Const a1 b) * (a3 :: Const a1 b) 
Instance details

Defined in Data.Singletons.Prelude.Const

type (a2 :: Const a1 b) * (a3 :: Const a1 b) = Apply (Apply (TFHelper_6989586621680953602Sym0 :: TyFun (Const a1 b) (Const a1 b ~> Const a1 b) -> Type) a2) a3
type (a2 :: Const a1 b) - (a3 :: Const a1 b) 
Instance details

Defined in Data.Singletons.Prelude.Const

type (a2 :: Const a1 b) - (a3 :: Const a1 b) = Apply (Apply (TFHelper_6989586621680953590Sym0 :: TyFun (Const a1 b) (Const a1 b ~> Const a1 b) -> Type) a2) a3
type (a2 :: Const a1 b) + (a3 :: Const a1 b) 
Instance details

Defined in Data.Singletons.Prelude.Const

type (a2 :: Const a1 b) + (a3 :: Const a1 b) = Apply (Apply (TFHelper_6989586621680953578Sym0 :: TyFun (Const a1 b) (Const a1 b ~> Const a1 b) -> Type) a2) a3
type Min (arg1 :: Const a b) (arg2 :: Const a b) 
Instance details

Defined in Data.Singletons.Prelude.Const

type Min (arg1 :: Const a b) (arg2 :: Const a b) = Apply (Apply (Min_6989586621679792614Sym0 :: TyFun (Const a b) (Const a b ~> Const a b) -> Type) arg1) arg2
type Max (arg1 :: Const a b) (arg2 :: Const a b) 
Instance details

Defined in Data.Singletons.Prelude.Const

type Max (arg1 :: Const a b) (arg2 :: Const a b) = Apply (Apply (Max_6989586621679792596Sym0 :: TyFun (Const a b) (Const a b ~> Const a b) -> Type) arg1) arg2
type (arg1 :: Const a b) >= (arg2 :: Const a b) 
Instance details

Defined in Data.Singletons.Prelude.Const

type (arg1 :: Const a b) >= (arg2 :: Const a b) = Apply (Apply (TFHelper_6989586621679792578Sym0 :: TyFun (Const a b) (Const a b ~> Bool) -> Type) arg1) arg2
type (arg1 :: Const a b) > (arg2 :: Const a b) 
Instance details

Defined in Data.Singletons.Prelude.Const

type (arg1 :: Const a b) > (arg2 :: Const a b) = Apply (Apply (TFHelper_6989586621679792560Sym0 :: TyFun (Const a b) (Const a b ~> Bool) -> Type) arg1) arg2
type (arg1 :: Const a b) <= (arg2 :: Const a b) 
Instance details

Defined in Data.Singletons.Prelude.Const

type (arg1 :: Const a b) <= (arg2 :: Const a b) = Apply (Apply (TFHelper_6989586621679792542Sym0 :: TyFun (Const a b) (Const a b ~> Bool) -> Type) arg1) arg2
type (arg1 :: Const a b) < (arg2 :: Const a b) 
Instance details

Defined in Data.Singletons.Prelude.Const

type (arg1 :: Const a b) < (arg2 :: Const a b) = Apply (Apply (TFHelper_6989586621679792524Sym0 :: TyFun (Const a b) (Const a b ~> Bool) -> Type) arg1) arg2
type Compare (a2 :: Const a1 b) (a3 :: Const a1 b) 
Instance details

Defined in Data.Singletons.Prelude.Const

type Compare (a2 :: Const a1 b) (a3 :: Const a1 b) = Apply (Apply (Compare_6989586621680953507Sym0 :: TyFun (Const a1 b) (Const a1 b ~> Ordering) -> Type) a2) a3
type (x :: Const a b) /= (y :: Const a b) 
Instance details

Defined in Data.Singletons.Prelude.Const

type (x :: Const a b) /= (y :: Const a b) = Not (x == y)
type (a2 :: Const a1 b1) == (b2 :: Const a1 b1) 
Instance details

Defined in Data.Singletons.Prelude.Const

type (a2 :: Const a1 b1) == (b2 :: Const a1 b1) = Equals_6989586621680953790 a2 b2
type ShowsPrec a2 (a3 :: Const a1 b) a4 
Instance details

Defined in Data.Singletons.Prelude.Const

type ShowsPrec a2 (a3 :: Const a1 b) a4 = Apply (Apply (Apply (ShowsPrec_6989586621680953655Sym0 :: TyFun Nat (Const a1 b ~> (Symbol ~> Symbol)) -> Type) a2) a3) a4
type EnumFromThenTo (a2 :: Const a1 b) (a3 :: Const a1 b) (a4 :: Const a1 b) 
Instance details

Defined in Data.Singletons.Prelude.Const

type EnumFromThenTo (a2 :: Const a1 b) (a3 :: Const a1 b) (a4 :: Const a1 b) = Apply (Apply (Apply (EnumFromThenTo_6989586621680953560Sym0 :: TyFun (Const a1 b) (Const a1 b ~> (Const a1 b ~> [Const a1 b])) -> Type) a2) a3) a4
type Apply (GetConstSym0 :: TyFun (Const a b) a -> Type) (x6989586621680951411 :: Const a b) 
Instance details

Defined in Data.Singletons.Prelude.Const

type Apply (GetConstSym0 :: TyFun (Const a b) a -> Type) (x6989586621680951411 :: Const a b) = GetConst x6989586621680951411
type Apply (FromEnum_6989586621680953539Sym0 :: TyFun (Const a b) Nat -> Type) (a6989586621680953538 :: Const a b) 
Instance details

Defined in Data.Singletons.Prelude.Const

type Apply (FromEnum_6989586621680953539Sym0 :: TyFun (Const a b) Nat -> Type) (a6989586621680953538 :: Const a b) = FromEnum_6989586621680953539 a6989586621680953538
type Apply (FoldMap_6989586621680953711Sym1 a6989586621680953709 m2 :: TyFun (Const m2 a) m1 -> Type) (a6989586621680953710 :: Const m2 a) 
Instance details

Defined in Data.Singletons.Prelude.Const

type Apply (FoldMap_6989586621680953711Sym1 a6989586621680953709 m2 :: TyFun (Const m2 a) m1 -> Type) (a6989586621680953710 :: Const m2 a) = FoldMap_6989586621680953711 a6989586621680953709 a6989586621680953710
type Apply (Compare_6989586621680953507Sym1 a6989586621680953505 :: TyFun (Const a b) Ordering -> Type) (a6989586621680953506 :: Const a b) 
Instance details

Defined in Data.Singletons.Prelude.Const

type Apply (Compare_6989586621680953507Sym1 a6989586621680953505 :: TyFun (Const a b) Ordering -> Type) (a6989586621680953506 :: Const a b) = Compare_6989586621680953507 a6989586621680953505 a6989586621680953506
type Apply (Foldr_6989586621680953731Sym2 a6989586621680953729 a6989586621680953728 m :: TyFun (Const m a) b -> Type) (a6989586621680953730 :: Const m a) 
Instance details

Defined in Data.Singletons.Prelude.Const

type Apply (Foldr_6989586621680953731Sym2 a6989586621680953729 a6989586621680953728 m :: TyFun (Const m a) b -> Type) (a6989586621680953730 :: Const m a) = Foldr_6989586621680953731 a6989586621680953729 a6989586621680953728 a6989586621680953730
type Apply (EnumFromTo_6989586621680953547Sym1 a6989586621680953545 :: TyFun (Const a b) [Const a b] -> Type) (a6989586621680953546 :: Const a b) 
Instance details

Defined in Data.Singletons.Prelude.Const

type Apply (EnumFromTo_6989586621680953547Sym1 a6989586621680953545 :: TyFun (Const a b) [Const a b] -> Type) (a6989586621680953546 :: Const a b) = EnumFromTo_6989586621680953547 a6989586621680953545 a6989586621680953546
type Apply (Traverse_6989586621680995125Sym1 a6989586621680995123 m :: TyFun (Const m a) (f (Const m b)) -> Type) (a6989586621680995124 :: Const m a) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type Apply (Traverse_6989586621680995125Sym1 a6989586621680995123 m :: TyFun (Const m a) (f (Const m b)) -> Type) (a6989586621680995124 :: Const m a) = Traverse_6989586621680995125 a6989586621680995123 a6989586621680995124
type Apply (EnumFromThenTo_6989586621680953560Sym2 a6989586621680953558 a6989586621680953557 :: TyFun (Const a b) [Const a b] -> Type) (a6989586621680953559 :: Const a b) 
Instance details

Defined in Data.Singletons.Prelude.Const

type Apply (EnumFromThenTo_6989586621680953560Sym2 a6989586621680953558 a6989586621680953557 :: TyFun (Const a b) [Const a b] -> Type) (a6989586621680953559 :: Const a b) = EnumFromThenTo_6989586621680953560 a6989586621680953558 a6989586621680953557 a6989586621680953559
type Apply (TFHelper_6989586621680953780Sym0 :: TyFun (Const m6989586621680952804 (a6989586621679962809 ~> b6989586621679962810)) (Const m6989586621680952804 a6989586621679962809 ~> Const m6989586621680952804 b6989586621679962810) -> Type) (a6989586621680953778 :: Const m6989586621680952804 (a6989586621679962809 ~> b6989586621679962810)) 
Instance details

Defined in Data.Singletons.Prelude.Const

type Apply (TFHelper_6989586621680953780Sym0 :: TyFun (Const m6989586621680952804 (a6989586621679962809 ~> b6989586621679962810)) (Const m6989586621680952804 a6989586621679962809 ~> Const m6989586621680952804 b6989586621679962810) -> Type) (a6989586621680953778 :: Const m6989586621680952804 (a6989586621679962809 ~> b6989586621679962810)) = TFHelper_6989586621680953780Sym1 a6989586621680953778
type Apply (Compare_6989586621680953507Sym0 :: TyFun (Const a6989586621680952767 b6989586621680952768) (Const a6989586621680952767 b6989586621680952768 ~> Ordering) -> Type) (a6989586621680953505 :: Const a6989586621680952767 b6989586621680952768) 
Instance details

Defined in Data.Singletons.Prelude.Const

type Apply (Compare_6989586621680953507Sym0 :: TyFun (Const a6989586621680952767 b6989586621680952768) (Const a6989586621680952767 b6989586621680952768 ~> Ordering) -> Type) (a6989586621680953505 :: Const a6989586621680952767 b6989586621680952768) = Compare_6989586621680953507Sym1 a6989586621680953505
type Apply (EnumFromTo_6989586621680953547Sym0 :: TyFun (Const a6989586621680952769 b6989586621680952770) (Const a6989586621680952769 b6989586621680952770 ~> [Const a6989586621680952769 b6989586621680952770]) -> Type) (a6989586621680953545 :: Const a6989586621680952769 b6989586621680952770) 
Instance details

Defined in Data.Singletons.Prelude.Const

type Apply (EnumFromTo_6989586621680953547Sym0 :: TyFun (Const a6989586621680952769 b6989586621680952770) (Const a6989586621680952769 b6989586621680952770 ~> [Const a6989586621680952769 b6989586621680952770]) -> Type) (a6989586621680953545 :: Const a6989586621680952769 b6989586621680952770) = EnumFromTo_6989586621680953547Sym1 a6989586621680953545
type Apply (EnumFromThenTo_6989586621680953560Sym0 :: TyFun (Const a6989586621680952769 b6989586621680952770) (Const a6989586621680952769 b6989586621680952770 ~> (Const a6989586621680952769 b6989586621680952770 ~> [Const a6989586621680952769 b6989586621680952770])) -> Type) (a6989586621680953557 :: Const a6989586621680952769 b6989586621680952770) 
Instance details

Defined in Data.Singletons.Prelude.Const

type Apply (EnumFromThenTo_6989586621680953560Sym0 :: TyFun (Const a6989586621680952769 b6989586621680952770) (Const a6989586621680952769 b6989586621680952770 ~> (Const a6989586621680952769 b6989586621680952770 ~> [Const a6989586621680952769 b6989586621680952770])) -> Type) (a6989586621680953557 :: Const a6989586621680952769 b6989586621680952770) = EnumFromThenTo_6989586621680953560Sym1 a6989586621680953557
type Apply (TFHelper_6989586621680953578Sym0 :: TyFun (Const a6989586621680952782 b6989586621680952783) (Const a6989586621680952782 b6989586621680952783 ~> Const a6989586621680952782 b6989586621680952783) -> Type) (a6989586621680953576 :: Const a6989586621680952782 b6989586621680952783) 
Instance details

Defined in Data.Singletons.Prelude.Const

type Apply (TFHelper_6989586621680953578Sym0 :: TyFun (Const a6989586621680952782 b6989586621680952783) (Const a6989586621680952782 b6989586621680952783 ~> Const a6989586621680952782 b6989586621680952783) -> Type) (a6989586621680953576 :: Const a6989586621680952782 b6989586621680952783) = TFHelper_6989586621680953578Sym1 a6989586621680953576
type Apply (TFHelper_6989586621680953590Sym0 :: TyFun (Const a6989586621680952782 b6989586621680952783) (Const a6989586621680952782 b6989586621680952783 ~> Const a6989586621680952782 b6989586621680952783) -> Type) (a6989586621680953588 :: Const a6989586621680952782 b6989586621680952783) 
Instance details

Defined in Data.Singletons.Prelude.Const

type Apply (TFHelper_6989586621680953590Sym0 :: TyFun (Const a6989586621680952782 b6989586621680952783) (Const a6989586621680952782 b6989586621680952783 ~> Const a6989586621680952782 b6989586621680952783) -> Type) (a6989586621680953588 :: Const a6989586621680952782 b6989586621680952783) = TFHelper_6989586621680953590Sym1 a6989586621680953588
type Apply (TFHelper_6989586621680953602Sym0 :: TyFun (Const a6989586621680952782 b6989586621680952783) (Const a6989586621680952782 b6989586621680952783 ~> Const a6989586621680952782 b6989586621680952783) -> Type) (a6989586621680953600 :: Const a6989586621680952782 b6989586621680952783) 
Instance details

Defined in Data.Singletons.Prelude.Const

type Apply (TFHelper_6989586621680953602Sym0 :: TyFun (Const a6989586621680952782 b6989586621680952783) (Const a6989586621680952782 b6989586621680952783 ~> Const a6989586621680952782 b6989586621680952783) -> Type) (a6989586621680953600 :: Const a6989586621680952782 b6989586621680952783) = TFHelper_6989586621680953602Sym1 a6989586621680953600
type Apply (TFHelper_6989586621680953642Sym0 :: TyFun (Const a6989586621680952794 b6989586621680952795) (Const a6989586621680952794 b6989586621680952795 ~> Const a6989586621680952794 b6989586621680952795) -> Type) (a6989586621680953640 :: Const a6989586621680952794 b6989586621680952795) 
Instance details

Defined in Data.Singletons.Prelude.Const

type Apply (TFHelper_6989586621680953642Sym0 :: TyFun (Const a6989586621680952794 b6989586621680952795) (Const a6989586621680952794 b6989586621680952795 ~> Const a6989586621680952794 b6989586621680952795) -> Type) (a6989586621680953640 :: Const a6989586621680952794 b6989586621680952795) = TFHelper_6989586621680953642Sym1 a6989586621680953640
type Apply (EnumFromThenTo_6989586621680953560Sym1 a6989586621680953557 :: TyFun (Const a6989586621680952769 b6989586621680952770) (Const a6989586621680952769 b6989586621680952770 ~> [Const a6989586621680952769 b6989586621680952770]) -> Type) (a6989586621680953558 :: Const a6989586621680952769 b6989586621680952770) 
Instance details

Defined in Data.Singletons.Prelude.Const

type Apply (EnumFromThenTo_6989586621680953560Sym1 a6989586621680953557 :: TyFun (Const a6989586621680952769 b6989586621680952770) (Const a6989586621680952769 b6989586621680952770 ~> [Const a6989586621680952769 b6989586621680952770]) -> Type) (a6989586621680953558 :: Const a6989586621680952769 b6989586621680952770) = EnumFromThenTo_6989586621680953560Sym2 a6989586621680953557 a6989586621680953558
type Apply (ShowsPrec_6989586621680953655Sym1 a6989586621680953652 a6989586621680952798 b6989586621680952799 :: TyFun (Const a6989586621680952798 b6989586621680952799) (Symbol ~> Symbol) -> Type) (a6989586621680953653 :: Const a6989586621680952798 b6989586621680952799) 
Instance details

Defined in Data.Singletons.Prelude.Const

type Apply (ShowsPrec_6989586621680953655Sym1 a6989586621680953652 a6989586621680952798 b6989586621680952799 :: TyFun (Const a6989586621680952798 b6989586621680952799) (Symbol ~> Symbol) -> Type) (a6989586621680953653 :: Const a6989586621680952798 b6989586621680952799) = ShowsPrec_6989586621680953655Sym2 a6989586621680953652 a6989586621680953653
type Apply (LiftA2_6989586621680953765Sym1 a6989586621680953762 m6989586621680952804 :: TyFun (Const m6989586621680952804 a6989586621679962811) (Const m6989586621680952804 b6989586621679962812 ~> Const m6989586621680952804 c6989586621679962813) -> Type) (a6989586621680953763 :: Const m6989586621680952804 a6989586621679962811) 
Instance details

Defined in Data.Singletons.Prelude.Const

type Apply (LiftA2_6989586621680953765Sym1 a6989586621680953762 m6989586621680952804 :: TyFun (Const m6989586621680952804 a6989586621679962811) (Const m6989586621680952804 b6989586621679962812 ~> Const m6989586621680952804 c6989586621679962813) -> Type) (a6989586621680953763 :: Const m6989586621680952804 a6989586621679962811) = LiftA2_6989586621680953765Sym2 a6989586621680953762 a6989586621680953763
type Apply (Succ_6989586621680953518Sym0 :: TyFun (Const a b) (Const a b) -> Type) (a6989586621680953517 :: Const a b) 
Instance details

Defined in Data.Singletons.Prelude.Const

type Apply (Succ_6989586621680953518Sym0 :: TyFun (Const a b) (Const a b) -> Type) (a6989586621680953517 :: Const a b) = Succ_6989586621680953518 a6989586621680953517
type Apply (Pred_6989586621680953525Sym0 :: TyFun (Const a b) (Const a b) -> Type) (a6989586621680953524 :: Const a b) 
Instance details

Defined in Data.Singletons.Prelude.Const

type Apply (Pred_6989586621680953525Sym0 :: TyFun (Const a b) (Const a b) -> Type) (a6989586621680953524 :: Const a b) = Pred_6989586621680953525 a6989586621680953524
type Apply (Negate_6989586621680953613Sym0 :: TyFun (Const a b) (Const a b) -> Type) (a6989586621680953612 :: Const a b) 
Instance details

Defined in Data.Singletons.Prelude.Const

type Apply (Negate_6989586621680953613Sym0 :: TyFun (Const a b) (Const a b) -> Type) (a6989586621680953612 :: Const a b) = Negate_6989586621680953613 a6989586621680953612
type Apply (Abs_6989586621680953620Sym0 :: TyFun (Const a b) (Const a b) -> Type) (a6989586621680953619 :: Const a b) 
Instance details

Defined in Data.Singletons.Prelude.Const

type Apply (Abs_6989586621680953620Sym0 :: TyFun (Const a b) (Const a b) -> Type) (a6989586621680953619 :: Const a b) = Abs_6989586621680953620 a6989586621680953619
type Apply (Signum_6989586621680953627Sym0 :: TyFun (Const a b) (Const a b) -> Type) (a6989586621680953626 :: Const a b) 
Instance details

Defined in Data.Singletons.Prelude.Const

type Apply (Signum_6989586621680953627Sym0 :: TyFun (Const a b) (Const a b) -> Type) (a6989586621680953626 :: Const a b) = Signum_6989586621680953627 a6989586621680953626
type Apply (Fmap_6989586621680953673Sym1 a6989586621680953671 m :: TyFun (Const m a) (Const m b) -> Type) (a6989586621680953672 :: Const m a) 
Instance details

Defined in Data.Singletons.Prelude.Const

type Apply (Fmap_6989586621680953673Sym1 a6989586621680953671 m :: TyFun (Const m a) (Const m b) -> Type) (a6989586621680953672 :: Const m a) = Fmap_6989586621680953673 a6989586621680953671 a6989586621680953672
type Apply (TFHelper_6989586621680953780Sym1 a6989586621680953778 :: TyFun (Const m a) (Const m b) -> Type) (a6989586621680953779 :: Const m a) 
Instance details

Defined in Data.Singletons.Prelude.Const

type Apply (TFHelper_6989586621680953780Sym1 a6989586621680953778 :: TyFun (Const m a) (Const m b) -> Type) (a6989586621680953779 :: Const m a) = TFHelper_6989586621680953780 a6989586621680953778 a6989586621680953779
type Apply (TFHelper_6989586621680953578Sym1 a6989586621680953576 :: TyFun (Const a b) (Const a b) -> Type) (a6989586621680953577 :: Const a b) 
Instance details

Defined in Data.Singletons.Prelude.Const

type Apply (TFHelper_6989586621680953578Sym1 a6989586621680953576 :: TyFun (Const a b) (Const a b) -> Type) (a6989586621680953577 :: Const a b) = TFHelper_6989586621680953578 a6989586621680953576 a6989586621680953577
type Apply (TFHelper_6989586621680953590Sym1 a6989586621680953588 :: TyFun (Const a b) (Const a b) -> Type) (a6989586621680953589 :: Const a b) 
Instance details

Defined in Data.Singletons.Prelude.Const

type Apply (TFHelper_6989586621680953590Sym1 a6989586621680953588 :: TyFun (Const a b) (Const a b) -> Type) (a6989586621680953589 :: Const a b) = TFHelper_6989586621680953590 a6989586621680953588 a6989586621680953589
type Apply (TFHelper_6989586621680953602Sym1 a6989586621680953600 :: TyFun (Const a b) (Const a b) -> Type) (a6989586621680953601 :: Const a b) 
Instance details

Defined in Data.Singletons.Prelude.Const

type Apply (TFHelper_6989586621680953602Sym1 a6989586621680953600 :: TyFun (Const a b) (Const a b) -> Type) (a6989586621680953601 :: Const a b) = TFHelper_6989586621680953602 a6989586621680953600 a6989586621680953601
type Apply (TFHelper_6989586621680953642Sym1 a6989586621680953640 :: TyFun (Const a b) (Const a b) -> Type) (a6989586621680953641 :: Const a b) 
Instance details

Defined in Data.Singletons.Prelude.Const

type Apply (TFHelper_6989586621680953642Sym1 a6989586621680953640 :: TyFun (Const a b) (Const a b) -> Type) (a6989586621680953641 :: Const a b) = TFHelper_6989586621680953642 a6989586621680953640 a6989586621680953641
type Apply (TFHelper_6989586621680953692Sym1 a6989586621680953690 m b :: TyFun (Const m b) (Const m a) -> Type) (a6989586621680953691 :: Const m b) 
Instance details

Defined in Data.Singletons.Prelude.Const

type Apply (TFHelper_6989586621680953692Sym1 a6989586621680953690 m b :: TyFun (Const m b) (Const m a) -> Type) (a6989586621680953691 :: Const m b) = TFHelper_6989586621680953692 a6989586621680953690 a6989586621680953691
type Apply (LiftA2_6989586621680953765Sym2 a6989586621680953763 a6989586621680953762 :: TyFun (Const m b) (Const m c) -> Type) (a6989586621680953764 :: Const m b) 
Instance details

Defined in Data.Singletons.Prelude.Const

type Apply (LiftA2_6989586621680953765Sym2 a6989586621680953763 a6989586621680953762 :: TyFun (Const m b) (Const m c) -> Type) (a6989586621680953764 :: Const m b) = LiftA2_6989586621680953765 a6989586621680953763 a6989586621680953762 a6989586621680953764

minimumBy :: Foldable t => (a -> a -> Ordering) -> t a -> a #

The least element of a non-empty structure with respect to the given comparison function.

maximumBy :: Foldable t => (a -> a -> Ordering) -> t a -> a #

The largest element of a non-empty structure with respect to the given comparison function.

concatMap :: Foldable t => (a -> [b]) -> t a -> [b] #

Map a function over all the elements of a container and concatenate the resulting lists.

foldlM :: (Foldable t, Monad m) => (b -> a -> m b) -> b -> t a -> m b #

Monadic fold over the elements of a structure, associating to the left, i.e. from left to right.

foldrM :: (Foldable t, Monad m) => (a -> b -> m b) -> b -> t a -> m b #

Monadic fold over the elements of a structure, associating to the right, i.e. from right to left.

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

Instances details
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 #

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 #

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) #

NFData1 First

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

liftRnf :: (a -> ()) -> First a -> () #

PTraversable First 
Instance details

Defined in Data.Singletons.Prelude.Traversable

Associated Types

type Traverse arg0 arg1 :: f0 (t0 b0) #

type SequenceA arg0 :: f0 (t0 a0) #

type MapM arg0 arg1 :: m0 (t0 b0) #

type Sequence arg0 :: m0 (t0 a0) #

STraversable First 
Instance details

Defined in Data.Singletons.Prelude.Traversable

Methods

sTraverse :: forall a (f :: Type -> Type) b (t1 :: a ~> f b) (t2 :: First a). SApplicative f => Sing t1 -> Sing t2 -> Sing (Apply (Apply TraverseSym0 t1) t2) #

sSequenceA :: forall (f :: Type -> Type) a (t :: First (f a)). SApplicative f => Sing t -> Sing (Apply SequenceASym0 t) #

sMapM :: forall a (m :: Type -> Type) b (t1 :: a ~> m b) (t2 :: First a). SMonad m => Sing t1 -> Sing t2 -> Sing (Apply (Apply MapMSym0 t1) t2) #

sSequence :: forall (m :: Type -> Type) a (t :: First (m a)). SMonad m => Sing t -> Sing (Apply SequenceSym0 t) #

PFoldable First 
Instance details

Defined in Data.Singletons.Prelude.Foldable

Associated Types

type Fold arg0 :: m0 #

type FoldMap arg0 arg1 :: m0 #

type Foldr arg0 arg1 arg2 :: b0 #

type Foldr' arg0 arg1 arg2 :: b0 #

type Foldl arg0 arg1 arg2 :: b0 #

type Foldl' arg0 arg1 arg2 :: b0 #

type Foldr1 arg0 arg1 :: a0 #

type Foldl1 arg0 arg1 :: a0 #

type ToList arg0 :: [a0] #

type Null arg0 :: Bool #

type Length arg0 :: Nat #

type Elem arg0 arg1 :: Bool #

type Maximum arg0 :: a0 #

type Minimum arg0 :: a0 #

type Sum arg0 :: a0 #

type Product arg0 :: a0 #

SFoldable First 
Instance details

Defined in Data.Singletons.Prelude.Foldable

Methods

sFold :: forall m (t :: First m). SMonoid m => Sing t -> Sing (Apply FoldSym0 t) #

sFoldMap :: forall a m (t1 :: a ~> m) (t2 :: First a). SMonoid m => Sing t1 -> Sing t2 -> Sing (Apply (Apply FoldMapSym0 t1) t2) #

sFoldr :: forall a b (t1 :: a ~> (b ~> b)) (t2 :: b) (t3 :: First a). Sing t1 -> Sing t2 -> Sing t3 -> Sing (Apply (Apply (Apply FoldrSym0 t1) t2) t3) #

sFoldr' :: forall a b (t1 :: a ~> (b ~> b)) (t2 :: b) (t3 :: First a). Sing t1 -> Sing t2 -> Sing t3 -> Sing (Apply (Apply (Apply Foldr'Sym0 t1) t2) t3) #

sFoldl :: forall b a (t1 :: b ~> (a ~> b)) (t2 :: b) (t3 :: First a). Sing t1 -> Sing t2 -> Sing t3 -> Sing (Apply (Apply (Apply FoldlSym0 t1) t2) t3) #

sFoldl' :: forall b a (t1 :: b ~> (a ~> b)) (t2 :: b) (t3 :: First a). Sing t1 -> Sing t2 -> Sing t3 -> Sing (Apply (Apply (Apply Foldl'Sym0 t1) t2) t3) #

sFoldr1 :: forall a (t1 :: a ~> (a ~> a)) (t2 :: First a). Sing t1 -> Sing t2 -> Sing (Apply (Apply Foldr1Sym0 t1) t2) #

sFoldl1 :: forall a (t1 :: a ~> (a ~> a)) (t2 :: First a). Sing t1 -> Sing t2 -> Sing (Apply (Apply Foldl1Sym0 t1) t2) #

sToList :: forall a (t :: First a). Sing t -> Sing (Apply ToListSym0 t) #

sNull :: forall a (t :: First a). Sing t -> Sing (Apply NullSym0 t) #

sLength :: forall a (t :: First a). Sing t -> Sing (Apply LengthSym0 t) #

sElem :: forall a (t1 :: a) (t2 :: First a). SEq a => Sing t1 -> Sing t2 -> Sing (Apply (Apply ElemSym0 t1) t2) #

sMaximum :: forall a (t :: First a). SOrd a => Sing t -> Sing (Apply MaximumSym0 t) #

sMinimum :: forall a (t :: First a). SOrd a => Sing t -> Sing (Apply MinimumSym0 t) #

sSum :: forall a (t :: First a). SNum a => Sing t -> Sing (Apply SumSym0 t) #

sProduct :: forall a (t :: First a). SNum a => Sing t -> Sing (Apply ProductSym0 t) #

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 #

Data a => Data (First a)

Since: base-4.8.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> First a -> c (First a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (First a) #

toConstr :: First a -> Constr #

dataTypeOf :: First a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (First a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (First a)) #

gmapT :: (forall b. Data b => b -> b) -> First a -> First a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> First a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> First a -> r #

gmapQ :: (forall d. Data d => d -> u) -> First a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> First a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> First a -> m (First a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> First a -> m (First a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> First a -> m (First a) #

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)

Since: base-4.7.0.0

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 #

NFData a => NFData (First a)

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: First a -> () #

Default (First a) 
Instance details

Defined in Data.Default.Class

Methods

def :: First a #

Wrapped (First a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (First a) #

Methods

_Wrapped' :: Iso' (First a) (Unwrapped (First a)) #

Container (First a) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element (First a) #

Methods

toList :: First a -> [Element (First a)] #

null :: First a -> Bool #

foldr :: (Element (First a) -> b -> b) -> b -> First a -> b #

foldl :: (b -> Element (First a) -> b) -> b -> First a -> b #

foldl' :: (b -> Element (First a) -> b) -> b -> First a -> b #

length :: First a -> Int #

elem :: Element (First a) -> First a -> Bool #

maximum :: First a -> Element (First a) #

minimum :: First a -> Element (First a) #

foldMap :: Monoid m => (Element (First a) -> m) -> First a -> m #

fold :: First a -> Element (First a) #

foldr' :: (Element (First a) -> b -> b) -> b -> First a -> b #

foldr1 :: (Element (First a) -> Element (First a) -> Element (First a)) -> First a -> Element (First a) #

foldl1 :: (Element (First a) -> Element (First a) -> Element (First a)) -> First a -> Element (First a) #

notElem :: Element (First a) -> First a -> Bool #

all :: (Element (First a) -> Bool) -> First a -> Bool #

any :: (Element (First a) -> Bool) -> First a -> Bool #

and :: First a -> Bool #

or :: First a -> Bool #

find :: (Element (First a) -> Bool) -> First a -> Maybe (Element (First a)) #

safeHead :: First a -> Maybe (Element (First a)) #

PMonoid (First a) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

Associated Types

type Mempty :: a0 #

type Mappend arg0 arg1 :: a0 #

type Mconcat arg0 :: a0 #

SMonoid (First a) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

Methods

sMempty :: Sing MemptySym0 #

sMappend :: forall (t1 :: First a) (t2 :: First a). Sing t1 -> Sing t2 -> Sing (Apply (Apply MappendSym0 t1) t2) #

sMconcat :: forall (t :: [First a]). Sing t -> Sing (Apply MconcatSym0 t) #

Generic1 First

Since: base-4.7.0.0

Instance details

Defined in Data.Monoid

Associated Types

type Rep1 First :: k -> Type #

Methods

from1 :: forall (a :: k). First a -> Rep1 First a #

to1 :: forall (a :: k). Rep1 First a -> First a #

t ~ First b => Rewrapped (First a) t 
Instance details

Defined in Control.Lens.Wrapped

IsoHKD First (a :: Type) 
Instance details

Defined in Data.Vinyl.XRec

Associated Types

type HKD First a #

Methods

unHKD :: HKD First a -> First a #

toHKD :: First a -> HKD First a #

SDecide (Maybe a) => TestCoercion (SFirst :: First a -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

Methods

testCoercion :: forall (a0 :: k) (b :: k). SFirst a0 -> SFirst b -> Maybe (Coercion a0 b) #

SDecide (Maybe a) => TestEquality (SFirst :: First a -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

Methods

testEquality :: forall (a0 :: k) (b :: k). SFirst a0 -> SFirst b -> Maybe (a0 :~: b) #

SingI (FirstSym0 :: TyFun (Maybe a) (First a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

Methods

sing :: Sing FirstSym0 #

SuppressUnusedWarnings (FirstSym0 :: TyFun (Maybe a6989586621679087424) (First a6989586621679087424) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

SuppressUnusedWarnings (ShowsPrec_6989586621680637780Sym0 :: TyFun Nat (First a6989586621679087424 ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

SuppressUnusedWarnings (Pure_6989586621680640865Sym0 :: TyFun a6989586621679962808 (First a6989586621679962808) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

SuppressUnusedWarnings (Let6989586621680640946ASym0 :: TyFun a6989586621679087424 (First a6989586621679087424) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

SuppressUnusedWarnings (TFHelper_6989586621680640938Sym0 :: TyFun (First a6989586621680640712) (First a6989586621680640712 ~> First a6989586621680640712) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

SuppressUnusedWarnings (GetFirstSym0 :: TyFun (First a6989586621679087424) (Maybe a6989586621679087424) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

SuppressUnusedWarnings (Compare_6989586621680636482Sym0 :: TyFun (First a6989586621679087424) (First a6989586621679087424 ~> Ordering) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

SuppressUnusedWarnings (TFHelper_6989586621680640899Sym0 :: TyFun a6989586621679962805 (First b6989586621679962806 ~> First a6989586621679962805) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

SuppressUnusedWarnings (TFHelper_6989586621680640938Sym1 a6989586621680640936 :: TyFun (First a6989586621680640712) (First a6989586621680640712) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

SuppressUnusedWarnings (TFHelper_6989586621680640911Sym0 :: TyFun (First a6989586621679962832) ((a6989586621679962832 ~> First b6989586621679962833) ~> First b6989586621679962833) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

SuppressUnusedWarnings (ShowsPrec_6989586621680637780Sym1 a6989586621680637777 a6989586621679087424 :: TyFun (First a6989586621679087424) (Symbol ~> Symbol) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

SuppressUnusedWarnings (Compare_6989586621680636482Sym1 a6989586621680636480 :: TyFun (First a6989586621679087424) Ordering -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

SuppressUnusedWarnings (TFHelper_6989586621680640875Sym0 :: TyFun (First (a6989586621679962809 ~> b6989586621679962810)) (First a6989586621679962809 ~> First b6989586621679962810) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

SuppressUnusedWarnings (Let6989586621680742749Scrutinee_6989586621680742640Sym0 :: TyFun (a6989586621680742384 ~> Bool) (TyFun (t6989586621680742381 a6989586621680742384) (First a6989586621680742384) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (Lambda_6989586621680742750Sym0 :: TyFun (a6989586621679087424 ~> Bool) (TyFun k (TyFun a6989586621679087424 (First a6989586621679087424) -> Type) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (Foldr_6989586621680824160Sym0 :: TyFun (a6989586621680742385 ~> (b6989586621680742386 ~> b6989586621680742386)) (b6989586621680742386 ~> (First a6989586621680742385 ~> b6989586621680742386)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (FoldMap_6989586621680824147Sym0 :: TyFun (a6989586621680742384 ~> m6989586621680742383) (First a6989586621680742384 ~> m6989586621680742383) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (Fmap_6989586621680640887Sym0 :: TyFun (a6989586621679962803 ~> b6989586621679962804) (First a6989586621679962803 ~> First b6989586621679962804) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

SuppressUnusedWarnings (Let6989586621680742749Scrutinee_6989586621680742640Sym1 p6989586621680742747 :: TyFun (t6989586621680742381 a6989586621680742384) (First a6989586621680742384) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (Lambda_6989586621680742750Sym1 p6989586621680742747 :: TyFun k (TyFun a6989586621679087424 (First a6989586621679087424) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (Foldr_6989586621680824160Sym1 a6989586621680824157 :: TyFun b6989586621680742386 (First a6989586621680742385 ~> b6989586621680742386) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (Lambda_6989586621680640919Sym0 :: TyFun k (TyFun (k1 ~> First a) (TyFun k1 (Maybe a) -> Type) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

SuppressUnusedWarnings (FoldMap_6989586621680824147Sym1 a6989586621680824145 :: TyFun (First a6989586621680742384) m6989586621680742383 -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (TFHelper_6989586621680640899Sym1 a6989586621680640897 b6989586621679962806 :: TyFun (First b6989586621679962806) (First a6989586621679962805) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

SuppressUnusedWarnings (TFHelper_6989586621680640875Sym1 a6989586621680640873 :: TyFun (First a6989586621679962809) (First b6989586621679962810) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

SuppressUnusedWarnings (Fmap_6989586621680640887Sym1 a6989586621680640885 :: TyFun (First a6989586621679962803) (First b6989586621679962804) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

SuppressUnusedWarnings (Traverse_6989586621680995173Sym0 :: TyFun (a6989586621680988964 ~> f6989586621680988963 b6989586621680988965) (First a6989586621680988964 ~> f6989586621680988963 (First b6989586621680988965)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

SuppressUnusedWarnings (TFHelper_6989586621680640911Sym1 a6989586621680640909 b6989586621679962833 :: TyFun (a6989586621679962832 ~> First b6989586621679962833) (First b6989586621679962833) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

SuppressUnusedWarnings (Lambda_6989586621680742750Sym2 y6989586621680742748 p6989586621680742747 :: TyFun a6989586621679087424 (First a6989586621679087424) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (Traverse_6989586621680995173Sym1 a6989586621680995171 :: TyFun (First a6989586621680988964) (f6989586621680988963 (First b6989586621680988965)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

SuppressUnusedWarnings (Foldr_6989586621680824160Sym2 a6989586621680824158 a6989586621680824157 :: TyFun (First a6989586621680742385) b6989586621680742386 -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (Lambda_6989586621680640919Sym1 a6989586621680640917 :: TyFun (k1 ~> First a) (TyFun k1 (Maybe a) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Product (arg0 :: First a0) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Product (arg0 :: First a0) = Apply (Product_6989586621680743347Sym0 :: TyFun (First a0) a0 -> Type) arg0
type Sum (arg0 :: First a0) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Sum (arg0 :: First a0) = Apply (Sum_6989586621680743334Sym0 :: TyFun (First a0) a0 -> Type) arg0
type Minimum (arg0 :: First a0) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Minimum (arg0 :: First a0) = Apply (Minimum_6989586621680743321Sym0 :: TyFun (First a0) a0 -> Type) arg0
type Maximum (arg0 :: First a0) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Maximum (arg0 :: First a0) = Apply (Maximum_6989586621680743308Sym0 :: TyFun (First a0) a0 -> Type) arg0
type Length (arg0 :: First a0) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Length (arg0 :: First a0) = Apply (Length_6989586621680743270Sym0 :: TyFun (First a0) Nat -> Type) arg0
type Null (arg0 :: First a0) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Null (arg0 :: First a0) = Apply (Null_6989586621680743249Sym0 :: TyFun (First a0) Bool -> Type) arg0
type ToList (arg0 :: First a0) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type ToList (arg0 :: First a0) = Apply (ToList_6989586621680743240Sym0 :: TyFun (First a0) [a0] -> Type) arg0
type Fold (arg0 :: First m0) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Fold (arg0 :: First m0) = Apply (Fold_6989586621680743057Sym0 :: TyFun (First m0) m0 -> Type) arg0
type Pure (a :: k1) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Pure (a :: k1) = Apply (Pure_6989586621680640865Sym0 :: TyFun k1 (First k1) -> Type) a
type Return (arg0 :: a0) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Return (arg0 :: a0) = Apply (Return_6989586621679963334Sym0 :: TyFun a0 (First a0) -> Type) arg0
type Sequence (arg0 :: First (m0 a0)) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type Sequence (arg0 :: First (m0 a0)) = Apply (Sequence_6989586621680989026Sym0 :: TyFun (First (m0 a0)) (m0 (First a0)) -> Type) arg0
type SequenceA (arg0 :: First (f0 a0)) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type SequenceA (arg0 :: First (f0 a0)) = Apply (SequenceA_6989586621680989001Sym0 :: TyFun (First (f0 a0)) (f0 (First a0)) -> Type) arg0
type Elem (arg1 :: a0) (arg2 :: First a0) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Elem (arg1 :: a0) (arg2 :: First a0) = Apply (Apply (Elem_6989586621680743293Sym0 :: TyFun a0 (First a0 ~> Bool) -> Type) arg1) arg2
type Foldl1 (arg1 :: a0 ~> (a0 ~> a0)) (arg2 :: First a0) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Foldl1 (arg1 :: a0 ~> (a0 ~> a0)) (arg2 :: First a0) = Apply (Apply (Foldl1_6989586621680743216Sym0 :: TyFun (a0 ~> (a0 ~> a0)) (First a0 ~> a0) -> Type) arg1) arg2
type Foldr1 (arg1 :: a0 ~> (a0 ~> a0)) (arg2 :: First a0) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Foldr1 (arg1 :: a0 ~> (a0 ~> a0)) (arg2 :: First a0) = Apply (Apply (Foldr1_6989586621680743191Sym0 :: TyFun (a0 ~> (a0 ~> a0)) (First a0 ~> a0) -> Type) arg1) arg2
type FoldMap (a1 :: a6989586621680742384 ~> k2) (a2 :: First a6989586621680742384) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type FoldMap (a1 :: a6989586621680742384 ~> k2) (a2 :: First a6989586621680742384) = Apply (Apply (FoldMap_6989586621680824147Sym0 :: TyFun (a6989586621680742384 ~> k2) (First a6989586621680742384 ~> k2) -> Type) a1) a2
type (a1 :: k1) <$ (a2 :: First b6989586621679962806) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type (a1 :: k1) <$ (a2 :: First b6989586621679962806) = Apply (Apply (TFHelper_6989586621680640899Sym0 :: TyFun k1 (First b6989586621679962806 ~> First k1) -> Type) a1) a2
type Fmap (a1 :: a6989586621679962803 ~> b6989586621679962804) (a2 :: First a6989586621679962803) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Fmap (a1 :: a6989586621679962803 ~> b6989586621679962804) (a2 :: First a6989586621679962803) = Apply (Apply (Fmap_6989586621680640887Sym0 :: TyFun (a6989586621679962803 ~> b6989586621679962804) (First a6989586621679962803 ~> First b6989586621679962804) -> Type) a1) a2
type (arg1 :: First a0) <* (arg2 :: First b0) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type (arg1 :: First a0) <* (arg2 :: First b0) = Apply (Apply (TFHelper_6989586621679963287Sym0 :: TyFun (First a0) (First b0 ~> First a0) -> Type) arg1) arg2
type (arg1 :: First a0) *> (arg2 :: First b0) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type (arg1 :: First a0) *> (arg2 :: First b0) = Apply (Apply (TFHelper_6989586621679963275Sym0 :: TyFun (First a0) (First b0 ~> First b0) -> Type) arg1) arg2
type (a1 :: First (a6989586621679962809 ~> b6989586621679962810)) <*> (a2 :: First a6989586621679962809) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type (a1 :: First (a6989586621679962809 ~> b6989586621679962810)) <*> (a2 :: First a6989586621679962809) = Apply (Apply (TFHelper_6989586621680640875Sym0 :: TyFun (First (a6989586621679962809 ~> b6989586621679962810)) (First a6989586621679962809 ~> First b6989586621679962810) -> Type) a1) a2
type (arg1 :: First a0) >> (arg2 :: First b0) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type (arg1 :: First a0) >> (arg2 :: First b0) = Apply (Apply (TFHelper_6989586621679963313Sym0 :: TyFun (First a0) (First b0 ~> First b0) -> Type) arg1) arg2
type (a1 :: First a6989586621679962832) >>= (a2 :: a6989586621679962832 ~> First b6989586621679962833) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type (a1 :: First a6989586621679962832) >>= (a2 :: a6989586621679962832 ~> First b6989586621679962833) = Apply (Apply (TFHelper_6989586621680640911Sym0 :: TyFun (First a6989586621679962832) ((a6989586621679962832 ~> First b6989586621679962833) ~> First b6989586621679962833) -> Type) a1) a2
type MapM (arg1 :: a0 ~> m0 b0) (arg2 :: First a0) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type MapM (arg1 :: a0 ~> m0 b0) (arg2 :: First a0) = Apply (Apply (MapM_6989586621680989011Sym0 :: TyFun (a0 ~> m0 b0) (First a0 ~> m0 (First b0)) -> Type) arg1) arg2
type Traverse (a1 :: a6989586621680988964 ~> f6989586621680988963 b6989586621680988965) (a2 :: First a6989586621680988964) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type Traverse (a1 :: a6989586621680988964 ~> f6989586621680988963 b6989586621680988965) (a2 :: First a6989586621680988964) = Apply (Apply (Traverse_6989586621680995173Sym0 :: TyFun (a6989586621680988964 ~> f6989586621680988963 b6989586621680988965) (First a6989586621680988964 ~> f6989586621680988963 (First b6989586621680988965)) -> Type) a1) a2
type Foldl' (arg1 :: b0 ~> (a0 ~> b0)) (arg2 :: b0) (arg3 :: First a0) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Foldl' (arg1 :: b0 ~> (a0 ~> b0)) (arg2 :: b0) (arg3 :: First a0) = Apply (Apply (Apply (Foldl'_6989586621680743162Sym0 :: TyFun (b0 ~> (a0 ~> b0)) (b0 ~> (First a0 ~> b0)) -> Type) arg1) arg2) arg3
type Foldl (arg1 :: b0 ~> (a0 ~> b0)) (arg2 :: b0) (arg3 :: First a0) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Foldl (arg1 :: b0 ~> (a0 ~> b0)) (arg2 :: b0) (arg3 :: First a0) = Apply (Apply (Apply (Foldl_6989586621680743137Sym0 :: TyFun (b0 ~> (a0 ~> b0)) (b0 ~> (First a0 ~> b0)) -> Type) arg1) arg2) arg3
type Foldr' (arg1 :: a0 ~> (b0 ~> b0)) (arg2 :: b0) (arg3 :: First a0) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Foldr' (arg1 :: a0 ~> (b0 ~> b0)) (arg2 :: b0) (arg3 :: First a0) = Apply (Apply (Apply (Foldr'_6989586621680743107Sym0 :: TyFun (a0 ~> (b0 ~> b0)) (b0 ~> (First a0 ~> b0)) -> Type) arg1) arg2) arg3
type Foldr (a1 :: a6989586621680742385 ~> (k2 ~> k2)) (a2 :: k2) (a3 :: First a6989586621680742385) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Foldr (a1 :: a6989586621680742385 ~> (k2 ~> k2)) (a2 :: k2) (a3 :: First a6989586621680742385) = Apply (Apply (Apply (Foldr_6989586621680824160Sym0 :: TyFun (a6989586621680742385 ~> (k2 ~> k2)) (k2 ~> (First a6989586621680742385 ~> k2)) -> Type) a1) a2) a3
type LiftA2 (arg1 :: a0 ~> (b0 ~> c0)) (arg2 :: First a0) (arg3 :: First b0) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type LiftA2 (arg1 :: a0 ~> (b0 ~> c0)) (arg2 :: First a0) (arg3 :: First b0) = Apply (Apply (Apply (LiftA2_6989586621679963257Sym0 :: TyFun (a0 ~> (b0 ~> c0)) (First a0 ~> (First b0 ~> First c0)) -> Type) arg1) arg2) arg3
type Apply (Pure_6989586621680640865Sym0 :: TyFun a (First a) -> Type) (a6989586621680640864 :: a) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (Pure_6989586621680640865Sym0 :: TyFun a (First a) -> Type) (a6989586621680640864 :: a) = Pure_6989586621680640865 a6989586621680640864
type Apply (Let6989586621680640946ASym0 :: TyFun a6989586621679087424 (First a6989586621679087424) -> Type) (wild_69895866216806407316989586621680640945 :: a6989586621679087424) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (Let6989586621680640946ASym0 :: TyFun a6989586621679087424 (First a6989586621679087424) -> Type) (wild_69895866216806407316989586621680640945 :: a6989586621679087424) = Let6989586621680640946A wild_69895866216806407316989586621680640945
type Apply (Lambda_6989586621680742750Sym2 y6989586621680742748 p6989586621680742747 :: TyFun a6989586621679087424 (First a6989586621679087424) -> Type) (t6989586621680742760 :: a6989586621679087424) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Lambda_6989586621680742750Sym2 y6989586621680742748 p6989586621680742747 :: TyFun a6989586621679087424 (First a6989586621679087424) -> Type) (t6989586621680742760 :: a6989586621679087424) = Lambda_6989586621680742750 y6989586621680742748 p6989586621680742747 t6989586621680742760
type Apply (ShowsPrec_6989586621680637780Sym0 :: TyFun Nat (First a6989586621679087424 ~> (Symbol ~> Symbol)) -> Type) (a6989586621680637777 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (ShowsPrec_6989586621680637780Sym0 :: TyFun Nat (First a6989586621679087424 ~> (Symbol ~> Symbol)) -> Type) (a6989586621680637777 :: Nat) = ShowsPrec_6989586621680637780Sym1 a6989586621680637777 a6989586621679087424 :: TyFun (First a6989586621679087424) (Symbol ~> Symbol) -> Type
type Apply (TFHelper_6989586621680640899Sym0 :: TyFun a6989586621679962805 (First b6989586621679962806 ~> First a6989586621679962805) -> Type) (a6989586621680640897 :: a6989586621679962805) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (TFHelper_6989586621680640899Sym0 :: TyFun a6989586621679962805 (First b6989586621679962806 ~> First a6989586621679962805) -> Type) (a6989586621680640897 :: a6989586621679962805) = TFHelper_6989586621680640899Sym1 a6989586621680640897 b6989586621679962806 :: TyFun (First b6989586621679962806) (First a6989586621679962805) -> Type
type Apply (Lambda_6989586621680742750Sym1 p6989586621680742747 :: TyFun k (TyFun a6989586621679087424 (First a6989586621679087424) -> Type) -> Type) (y6989586621680742748 :: k) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Lambda_6989586621680742750Sym1 p6989586621680742747 :: TyFun k (TyFun a6989586621679087424 (First a6989586621679087424) -> Type) -> Type) (y6989586621680742748 :: k) = Lambda_6989586621680742750Sym2 p6989586621680742747 y6989586621680742748
type Apply (Foldr_6989586621680824160Sym1 a6989586621680824157 :: TyFun b6989586621680742386 (First a6989586621680742385 ~> b6989586621680742386) -> Type) (a6989586621680824158 :: b6989586621680742386) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Foldr_6989586621680824160Sym1 a6989586621680824157 :: TyFun b6989586621680742386 (First a6989586621680742385 ~> b6989586621680742386) -> Type) (a6989586621680824158 :: b6989586621680742386) = Foldr_6989586621680824160Sym2 a6989586621680824157 a6989586621680824158
type Apply (Lambda_6989586621680640919Sym0 :: TyFun k (TyFun (k1 ~> First a) (TyFun k1 (Maybe a) -> Type) -> Type) -> Type) (a6989586621680640917 :: k) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (Lambda_6989586621680640919Sym0 :: TyFun k (TyFun (k1 ~> First a) (TyFun k1 (Maybe a) -> Type) -> Type) -> Type) (a6989586621680640917 :: k) = Lambda_6989586621680640919Sym1 a6989586621680640917 :: TyFun (k1 ~> First a) (TyFun k1 (Maybe a) -> Type) -> Type
type Rep (First a) 
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 Unwrapped (First a) 
Instance details

Defined in Control.Lens.Wrapped

type Unwrapped (First a) = Maybe a
type Sing 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Sing = SFirst :: First a -> Type
type Element (First a) 
Instance details

Defined in Universum.Container.Class

type Element (First a) = ElementDefault (First a)
type Mempty 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Mempty = Mempty_6989586621680640950Sym0 :: First a
type Demote (First a) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Demote (First a) = First (Demote a)
type Rep1 First 
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 (arg0 :: [First a]) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Mconcat (arg0 :: [First a]) = Apply (Mconcat_6989586621680631303Sym0 :: TyFun [First a] (First a) -> Type) arg0
type Show_ (arg0 :: First a) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Show_ (arg0 :: First a) = Apply (Show__6989586621680577846Sym0 :: TyFun (First a) Symbol -> Type) arg0
type Sconcat (arg0 :: NonEmpty (First a)) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Sconcat (arg0 :: NonEmpty (First a)) = Apply (Sconcat_6989586621680187691Sym0 :: TyFun (NonEmpty (First a)) (First a) -> Type) arg0
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_6989586621680631288Sym0 :: 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_6989586621680577854Sym0 :: 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_6989586621680640938Sym0 :: 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_6989586621679792614Sym0 :: 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_6989586621679792596Sym0 :: 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_6989586621679792578Sym0 :: 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_6989586621679792560Sym0 :: 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_6989586621679792542Sym0 :: 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_6989586621679792524Sym0 :: 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_6989586621680636482Sym0 :: 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_6989586621680635878 a2 b
type HKD First (a :: Type) 
Instance details

Defined in Data.Vinyl.XRec

type HKD First (a :: Type) = First a
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_6989586621680637780Sym0 :: TyFun Nat (First a1 ~> (Symbol ~> Symbol)) -> Type) a2) a3) a4
type Apply (Compare_6989586621680636482Sym1 a6989586621680636480 :: TyFun (First a) Ordering -> Type) (a6989586621680636481 :: First a) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (Compare_6989586621680636482Sym1 a6989586621680636480 :: TyFun (First a) Ordering -> Type) (a6989586621680636481 :: First a) = Compare_6989586621680636482 a6989586621680636480 a6989586621680636481
type Apply (FoldMap_6989586621680824147Sym1 a6989586621680824145 :: TyFun (First a) m -> Type) (a6989586621680824146 :: First a) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (FoldMap_6989586621680824147Sym1 a6989586621680824145 :: TyFun (First a) m -> Type) (a6989586621680824146 :: First a) = FoldMap_6989586621680824147 a6989586621680824145 a6989586621680824146
type Apply (Foldr_6989586621680824160Sym2 a6989586621680824158 a6989586621680824157 :: TyFun (First a) b -> Type) (a6989586621680824159 :: First a) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Foldr_6989586621680824160Sym2 a6989586621680824158 a6989586621680824157 :: TyFun (First a) b -> Type) (a6989586621680824159 :: First a) = Foldr_6989586621680824160 a6989586621680824158 a6989586621680824157 a6989586621680824159
type Apply (FirstSym0 :: TyFun (Maybe a) (First a) -> Type) (t6989586621680634737 :: Maybe a) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (FirstSym0 :: TyFun (Maybe a) (First a) -> Type) (t6989586621680634737 :: Maybe a) = 'First t6989586621680634737
type Apply (GetFirstSym0 :: TyFun (First a) (Maybe a) -> Type) (a6989586621680634734 :: First a) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (GetFirstSym0 :: TyFun (First a) (Maybe a) -> Type) (a6989586621680634734 :: First a) = GetFirst a6989586621680634734
type Apply (TFHelper_6989586621680640938Sym1 a6989586621680640936 :: TyFun (First a) (First a) -> Type) (a6989586621680640937 :: First a) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (TFHelper_6989586621680640938Sym1 a6989586621680640936 :: TyFun (First a) (First a) -> Type) (a6989586621680640937 :: First a) = TFHelper_6989586621680640938 a6989586621680640936 a6989586621680640937
type Apply (Let6989586621680742749Scrutinee_6989586621680742640Sym1 p6989586621680742747 :: TyFun (t6989586621680742381 a6989586621680742384) (First a6989586621680742384) -> Type) (y6989586621680742748 :: t6989586621680742381 a6989586621680742384) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Let6989586621680742749Scrutinee_6989586621680742640Sym1 p6989586621680742747 :: TyFun (t6989586621680742381 a6989586621680742384) (First a6989586621680742384) -> Type) (y6989586621680742748 :: t6989586621680742381 a6989586621680742384) = Let6989586621680742749Scrutinee_6989586621680742640 p6989586621680742747 y6989586621680742748
type Apply (TFHelper_6989586621680640875Sym1 a6989586621680640873 :: TyFun (First a) (First b) -> Type) (a6989586621680640874 :: First a) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (TFHelper_6989586621680640875Sym1 a6989586621680640873 :: TyFun (First a) (First b) -> Type) (a6989586621680640874 :: First a) = TFHelper_6989586621680640875 a6989586621680640873 a6989586621680640874
type Apply (Fmap_6989586621680640887Sym1 a6989586621680640885 :: TyFun (First a) (First b) -> Type) (a6989586621680640886 :: First a) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (Fmap_6989586621680640887Sym1 a6989586621680640885 :: TyFun (First a) (First b) -> Type) (a6989586621680640886 :: First a) = Fmap_6989586621680640887 a6989586621680640885 a6989586621680640886
type Apply (TFHelper_6989586621680640899Sym1 a6989586621680640897 b :: TyFun (First b) (First a) -> Type) (a6989586621680640898 :: First b) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (TFHelper_6989586621680640899Sym1 a6989586621680640897 b :: TyFun (First b) (First a) -> Type) (a6989586621680640898 :: First b) = TFHelper_6989586621680640899 a6989586621680640897 a6989586621680640898
type Apply (Traverse_6989586621680995173Sym1 a6989586621680995171 :: TyFun (First a) (f (First b)) -> Type) (a6989586621680995172 :: First a) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type Apply (Traverse_6989586621680995173Sym1 a6989586621680995171 :: TyFun (First a) (f (First b)) -> Type) (a6989586621680995172 :: First a) = Traverse_6989586621680995173 a6989586621680995171 a6989586621680995172
type Apply (Compare_6989586621680636482Sym0 :: TyFun (First a6989586621679087424) (First a6989586621679087424 ~> Ordering) -> Type) (a6989586621680636480 :: First a6989586621679087424) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (Compare_6989586621680636482Sym0 :: TyFun (First a6989586621679087424) (First a6989586621679087424 ~> Ordering) -> Type) (a6989586621680636480 :: First a6989586621679087424) = Compare_6989586621680636482Sym1 a6989586621680636480
type Apply (TFHelper_6989586621680640938Sym0 :: TyFun (First a6989586621680640712) (First a6989586621680640712 ~> First a6989586621680640712) -> Type) (a6989586621680640936 :: First a6989586621680640712) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (TFHelper_6989586621680640938Sym0 :: TyFun (First a6989586621680640712) (First a6989586621680640712 ~> First a6989586621680640712) -> Type) (a6989586621680640936 :: First a6989586621680640712) = TFHelper_6989586621680640938Sym1 a6989586621680640936
type Apply (ShowsPrec_6989586621680637780Sym1 a6989586621680637777 a6989586621679087424 :: TyFun (First a6989586621679087424) (Symbol ~> Symbol) -> Type) (a6989586621680637778 :: First a6989586621679087424) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (ShowsPrec_6989586621680637780Sym1 a6989586621680637777 a6989586621679087424 :: TyFun (First a6989586621679087424) (Symbol ~> Symbol) -> Type) (a6989586621680637778 :: First a6989586621679087424) = ShowsPrec_6989586621680637780Sym2 a6989586621680637777 a6989586621680637778
type Apply (TFHelper_6989586621680640911Sym0 :: TyFun (First a6989586621679962832) ((a6989586621679962832 ~> First b6989586621679962833) ~> First b6989586621679962833) -> Type) (a6989586621680640909 :: First a6989586621679962832) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (TFHelper_6989586621680640911Sym0 :: TyFun (First a6989586621679962832) ((a6989586621679962832 ~> First b6989586621679962833) ~> First b6989586621679962833) -> Type) (a6989586621680640909 :: First a6989586621679962832) = TFHelper_6989586621680640911Sym1 a6989586621680640909 b6989586621679962833 :: TyFun (a6989586621679962832 ~> First b6989586621679962833) (First b6989586621679962833) -> Type
type Apply (TFHelper_6989586621680640875Sym0 :: TyFun (First (a6989586621679962809 ~> b6989586621679962810)) (First a6989586621679962809 ~> First b6989586621679962810) -> Type) (a6989586621680640873 :: First (a6989586621679962809 ~> b6989586621679962810)) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (TFHelper_6989586621680640875Sym0 :: TyFun (First (a6989586621679962809 ~> b6989586621679962810)) (First a6989586621679962809 ~> First b6989586621679962810) -> Type) (a6989586621680640873 :: First (a6989586621679962809 ~> b6989586621679962810)) = TFHelper_6989586621680640875Sym1 a6989586621680640873
type Apply (TFHelper_6989586621680640911Sym1 a6989586621680640909 b :: TyFun (a ~> First b) (First b) -> Type) (a6989586621680640910 :: a ~> First b) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (TFHelper_6989586621680640911Sym1 a6989586621680640909 b :: TyFun (a ~> First b) (First b) -> Type) (a6989586621680640910 :: a ~> First b) = TFHelper_6989586621680640911 a6989586621680640909 a6989586621680640910
type Apply (Lambda_6989586621680742750Sym0 :: TyFun (a6989586621679087424 ~> Bool) (TyFun k (TyFun a6989586621679087424 (First a6989586621679087424) -> Type) -> Type) -> Type) (p6989586621680742747 :: a6989586621679087424 ~> Bool) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Lambda_6989586621680742750Sym0 :: TyFun (a6989586621679087424 ~> Bool) (TyFun k (TyFun a6989586621679087424 (First a6989586621679087424) -> Type) -> Type) -> Type) (p6989586621680742747 :: a6989586621679087424 ~> Bool) = Lambda_6989586621680742750Sym1 p6989586621680742747 :: TyFun k (TyFun a6989586621679087424 (First a6989586621679087424) -> Type) -> Type
type Apply (Let6989586621680742749Scrutinee_6989586621680742640Sym0 :: TyFun (a6989586621680742384 ~> Bool) (TyFun (t6989586621680742381 a6989586621680742384) (First a6989586621680742384) -> Type) -> Type) (p6989586621680742747 :: a6989586621680742384 ~> Bool) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Let6989586621680742749Scrutinee_6989586621680742640Sym0 :: TyFun (a6989586621680742384 ~> Bool) (TyFun (t6989586621680742381 a6989586621680742384) (First a6989586621680742384) -> Type) -> Type) (p6989586621680742747 :: a6989586621680742384 ~> Bool) = Let6989586621680742749Scrutinee_6989586621680742640Sym1 p6989586621680742747 :: TyFun (t6989586621680742381 a6989586621680742384) (First a6989586621680742384) -> Type
type Apply (FoldMap_6989586621680824147Sym0 :: TyFun (a6989586621680742384 ~> m6989586621680742383) (First a6989586621680742384 ~> m6989586621680742383) -> Type) (a6989586621680824145 :: a6989586621680742384 ~> m6989586621680742383) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (FoldMap_6989586621680824147Sym0 :: TyFun (a6989586621680742384 ~> m6989586621680742383) (First a6989586621680742384 ~> m6989586621680742383) -> Type) (a6989586621680824145 :: a6989586621680742384 ~> m6989586621680742383) = FoldMap_6989586621680824147Sym1 a6989586621680824145
type Apply (Foldr_6989586621680824160Sym0 :: TyFun (a6989586621680742385 ~> (b6989586621680742386 ~> b6989586621680742386)) (b6989586621680742386 ~> (First a6989586621680742385 ~> b6989586621680742386)) -> Type) (a6989586621680824157 :: a6989586621680742385 ~> (b6989586621680742386 ~> b6989586621680742386)) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Foldr_6989586621680824160Sym0 :: TyFun (a6989586621680742385 ~> (b6989586621680742386 ~> b6989586621680742386)) (b6989586621680742386 ~> (First a6989586621680742385 ~> b6989586621680742386)) -> Type) (a6989586621680824157 :: a6989586621680742385 ~> (b6989586621680742386 ~> b6989586621680742386)) = Foldr_6989586621680824160Sym1 a6989586621680824157
type Apply (Fmap_6989586621680640887Sym0 :: TyFun (a6989586621679962803 ~> b6989586621679962804) (First a6989586621679962803 ~> First b6989586621679962804) -> Type) (a6989586621680640885 :: a6989586621679962803 ~> b6989586621679962804) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (Fmap_6989586621680640887Sym0 :: TyFun (a6989586621679962803 ~> b6989586621679962804) (First a6989586621679962803 ~> First b6989586621679962804) -> Type) (a6989586621680640885 :: a6989586621679962803 ~> b6989586621679962804) = Fmap_6989586621680640887Sym1 a6989586621680640885
type Apply (Traverse_6989586621680995173Sym0 :: TyFun (a6989586621680988964 ~> f6989586621680988963 b6989586621680988965) (First a6989586621680988964 ~> f6989586621680988963 (First b6989586621680988965)) -> Type) (a6989586621680995171 :: a6989586621680988964 ~> f6989586621680988963 b6989586621680988965) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type Apply (Traverse_6989586621680995173Sym0 :: TyFun (a6989586621680988964 ~> f6989586621680988963 b6989586621680988965) (First a6989586621680988964 ~> f6989586621680988963 (First b6989586621680988965)) -> Type) (a6989586621680995171 :: a6989586621680988964 ~> f6989586621680988963 b6989586621680988965) = Traverse_6989586621680995173Sym1 a6989586621680995171
type Apply (Lambda_6989586621680640919Sym1 a6989586621680640917 :: TyFun (k1 ~> First a) (TyFun k1 (Maybe a) -> Type) -> Type) (k6989586621680640918 :: k1 ~> First a) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (Lambda_6989586621680640919Sym1 a6989586621680640917 :: TyFun (k1 ~> First a) (TyFun k1 (Maybe a) -> Type) -> Type) (k6989586621680640918 :: k1 ~> First a) = Lambda_6989586621680640919Sym2 a6989586621680640917 k6989586621680640918

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

Instances details
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 #

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 #

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) #

NFData1 Last

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

liftRnf :: (a -> ()) -> Last a -> () #

PTraversable Last 
Instance details

Defined in Data.Singletons.Prelude.Traversable

Associated Types

type Traverse arg0 arg1 :: f0 (t0 b0) #

type SequenceA arg0 :: f0 (t0 a0) #

type MapM arg0 arg1 :: m0 (t0 b0) #

type Sequence arg0 :: m0 (t0 a0) #

STraversable Last 
Instance details

Defined in Data.Singletons.Prelude.Traversable

Methods

sTraverse :: forall a (f :: Type -> Type) b (t1 :: a ~> f b) (t2 :: Last a). SApplicative f => Sing t1 -> Sing t2 -> Sing (Apply (Apply TraverseSym0 t1) t2) #

sSequenceA :: forall (f :: Type -> Type) a (t :: Last (f a)). SApplicative f => Sing t -> Sing (Apply SequenceASym0 t) #

sMapM :: forall a (m :: Type -> Type) b (t1 :: a ~> m b) (t2 :: Last a). SMonad m => Sing t1 -> Sing t2 -> Sing (Apply (Apply MapMSym0 t1) t2) #

sSequence :: forall (m :: Type -> Type) a (t :: Last (m a)). SMonad m => Sing t -> Sing (Apply SequenceSym0 t) #

PFoldable Last 
Instance details

Defined in Data.Singletons.Prelude.Foldable

Associated Types

type Fold arg0 :: m0 #

type FoldMap arg0 arg1 :: m0 #

type Foldr arg0 arg1 arg2 :: b0 #

type Foldr' arg0 arg1 arg2 :: b0 #

type Foldl arg0 arg1 arg2 :: b0 #

type Foldl' arg0 arg1 arg2 :: b0 #

type Foldr1 arg0 arg1 :: a0 #

type Foldl1 arg0 arg1 :: a0 #

type ToList arg0 :: [a0] #

type Null arg0 :: Bool #

type Length arg0 :: Nat #

type Elem arg0 arg1 :: Bool #

type Maximum arg0 :: a0 #

type Minimum arg0 :: a0 #

type Sum arg0 :: a0 #

type Product arg0 :: a0 #

SFoldable Last 
Instance details

Defined in Data.Singletons.Prelude.Foldable

Methods

sFold :: forall m (t :: Last m). SMonoid m => Sing t -> Sing (Apply FoldSym0 t) #

sFoldMap :: forall a m (t1 :: a ~> m) (t2 :: Last a). SMonoid m => Sing t1 -> Sing t2 -> Sing (Apply (Apply FoldMapSym0 t1) t2) #

sFoldr :: forall a b (t1 :: a ~> (b ~> b)) (t2 :: b) (t3 :: Last a). Sing t1 -> Sing t2 -> Sing t3 -> Sing (Apply (Apply (Apply FoldrSym0 t1) t2) t3) #

sFoldr' :: forall a b (t1 :: a ~> (b ~> b)) (t2 :: b) (t3 :: Last a). Sing t1 -> Sing t2 -> Sing t3 -> Sing (Apply (Apply (Apply Foldr'Sym0 t1) t2) t3) #

sFoldl :: forall b a (t1 :: b ~> (a ~> b)) (t2 :: b) (t3 :: Last a). Sing t1 -> Sing t2 -> Sing t3 -> Sing (Apply (Apply (Apply FoldlSym0 t1) t2) t3) #

sFoldl' :: forall b a (t1 :: b ~> (a ~> b)) (t2 :: b) (t3 :: Last a). Sing t1 -> Sing t2 -> Sing t3 -> Sing (Apply (Apply (Apply Foldl'Sym0 t1) t2) t3) #

sFoldr1 :: forall a (t1 :: a ~> (a ~> a)) (t2 :: Last a). Sing t1 -> Sing t2 -> Sing (Apply (Apply Foldr1Sym0 t1) t2) #

sFoldl1 :: forall a (t1 :: a ~> (a ~> a)) (t2 :: Last a). Sing t1 -> Sing t2 -> Sing (Apply (Apply Foldl1Sym0 t1) t2) #

sToList :: forall a (t :: Last a). Sing t -> Sing (Apply ToListSym0 t) #

sNull :: forall a (t :: Last a). Sing t -> Sing (Apply NullSym0 t) #

sLength :: forall a (t :: Last a). Sing t -> Sing (Apply LengthSym0 t) #

sElem :: forall a (t1 :: a) (t2 :: Last a). SEq a => Sing t1 -> Sing t2 -> Sing (Apply (Apply ElemSym0 t1) t2) #

sMaximum :: forall a (t :: Last a). SOrd a => Sing t -> Sing (Apply MaximumSym0 t) #

sMinimum :: forall a (t :: Last a). SOrd a => Sing t -> Sing (Apply MinimumSym0 t) #

sSum :: forall a (t :: Last a). SNum a => Sing t -> Sing (Apply SumSym0 t) #

sProduct :: forall a (t :: Last a). SNum a => Sing t -> Sing (Apply ProductSym0 t) #

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 #

Data a => Data (Last a)

Since: base-4.8.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Last a -> c (Last a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Last a) #

toConstr :: Last a -> Constr #

dataTypeOf :: Last a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Last a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Last a)) #

gmapT :: (forall b. Data b => b -> b) -> Last a -> Last a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Last a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Last a -> r #

gmapQ :: (forall d. Data d => d -> u) -> Last a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Last a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Last a -> m (Last a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Last a -> m (Last a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Last a -> m (Last a) #

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)

Since: base-4.7.0.0

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 #

NFData a => NFData (Last a)

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Last a -> () #

Default (Last a) 
Instance details

Defined in Data.Default.Class

Methods

def :: Last a #

Wrapped (Last a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (Last a) #

Methods

_Wrapped' :: Iso' (Last a) (Unwrapped (Last a)) #

Container (Last a) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element (Last a) #

Methods

toList :: Last a -> [Element (Last a)] #

null :: Last a -> Bool #

foldr :: (Element (Last a) -> b -> b) -> b -> Last a -> b #

foldl :: (b -> Element (Last a) -> b) -> b -> Last a -> b #

foldl' :: (b -> Element (Last a) -> b) -> b -> Last a -> b #

length :: Last a -> Int #

elem :: Element (Last a) -> Last a -> Bool #

maximum :: Last a -> Element (Last a) #

minimum :: Last a -> Element (Last a) #

foldMap :: Monoid m => (Element (Last a) -> m) -> Last a -> m #

fold :: Last a -> Element (Last a) #

foldr' :: (Element (Last a) -> b -> b) -> b -> Last a -> b #

foldr1 :: (Element (Last a) -> Element (Last a) -> Element (Last a)) -> Last a -> Element (Last a) #

foldl1 :: (Element (Last a) -> Element (Last a) -> Element (Last a)) -> Last a -> Element (Last a) #

notElem :: Element (Last a) -> Last a -> Bool #

all :: (Element (Last a) -> Bool) -> Last a -> Bool #

any :: (Element (Last a) -> Bool) -> Last a -> Bool #

and :: Last a -> Bool #

or :: Last a -> Bool #

find :: (Element (Last a) -> Bool) -> Last a -> Maybe (Element (Last a)) #

safeHead :: Last a -> Maybe (Element (Last a)) #

PMonoid (Last a) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

Associated Types

type Mempty :: a0 #

type Mappend arg0 arg1 :: a0 #

type Mconcat arg0 :: a0 #

SMonoid (Last a) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

Methods

sMempty :: Sing MemptySym0 #

sMappend :: forall (t1 :: Last a) (t2 :: Last a). Sing t1 -> Sing t2 -> Sing (Apply (Apply MappendSym0 t1) t2) #

sMconcat :: forall (t :: [Last a]). Sing t -> Sing (Apply MconcatSym0 t) #

Generic1 Last

Since: base-4.7.0.0

Instance details

Defined in Data.Monoid

Associated Types

type Rep1 Last :: k -> Type #

Methods

from1 :: forall (a :: k). Last a -> Rep1 Last a #

to1 :: forall (a :: k). Rep1 Last a -> Last a #

t ~ Last b => Rewrapped (Last a) t 
Instance details

Defined in Control.Lens.Wrapped

IsoHKD Last (a :: Type) 
Instance details

Defined in Data.Vinyl.XRec

Associated Types

type HKD Last a #

Methods

unHKD :: HKD Last a -> Last a #

toHKD :: Last a -> HKD Last a #

SDecide (Maybe a) => TestCoercion (SLast :: Last a -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

Methods

testCoercion :: forall (a0 :: k) (b :: k). SLast a0 -> SLast b -> Maybe (Coercion a0 b) #

SDecide (Maybe a) => TestEquality (SLast :: Last a -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

Methods

testEquality :: forall (a0 :: k) (b :: k). SLast a0 -> SLast b -> Maybe (a0 :~: b) #

SingI (LastSym0 :: TyFun (Maybe a) (Last a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

Methods

sing :: Sing LastSym0 #

SuppressUnusedWarnings (LastSym0 :: TyFun (Maybe a6989586621679087417) (Last a6989586621679087417) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

SuppressUnusedWarnings (ShowsPrec_6989586621680637811Sym0 :: TyFun Nat (Last a6989586621679087417 ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

SuppressUnusedWarnings (Pure_6989586621680640953Sym0 :: TyFun a6989586621679962808 (Last a6989586621679962808) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

SuppressUnusedWarnings (Let6989586621680641034BSym0 :: TyFun a6989586621679087417 (Last a6989586621679087417) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

SuppressUnusedWarnings (TFHelper_6989586621680641026Sym0 :: TyFun (Last a6989586621680640722) (Last a6989586621680640722 ~> Last a6989586621680640722) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

SuppressUnusedWarnings (GetLastSym0 :: TyFun (Last a6989586621679087417) (Maybe a6989586621679087417) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

SuppressUnusedWarnings (Compare_6989586621680636503Sym0 :: TyFun (Last a6989586621679087417) (Last a6989586621679087417 ~> Ordering) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

SuppressUnusedWarnings (TFHelper_6989586621680640987Sym0 :: TyFun a6989586621679962805 (Last b6989586621679962806 ~> Last a6989586621679962805) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

SuppressUnusedWarnings (TFHelper_6989586621680641026Sym1 a6989586621680641024 :: TyFun (Last a6989586621680640722) (Last a6989586621680640722) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

SuppressUnusedWarnings (TFHelper_6989586621680640999Sym0 :: TyFun (Last a6989586621679962832) ((a6989586621679962832 ~> Last b6989586621679962833) ~> Last b6989586621679962833) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

SuppressUnusedWarnings (ShowsPrec_6989586621680637811Sym1 a6989586621680637808 a6989586621679087417 :: TyFun (Last a6989586621679087417) (Symbol ~> Symbol) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

SuppressUnusedWarnings (Compare_6989586621680636503Sym1 a6989586621680636501 :: TyFun (Last a6989586621679087417) Ordering -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

SuppressUnusedWarnings (TFHelper_6989586621680640963Sym0 :: TyFun (Last (a6989586621679962809 ~> b6989586621679962810)) (Last a6989586621679962809 ~> Last b6989586621679962810) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

SuppressUnusedWarnings (Foldr_6989586621680824200Sym0 :: TyFun (a6989586621680742385 ~> (b6989586621680742386 ~> b6989586621680742386)) (b6989586621680742386 ~> (Last a6989586621680742385 ~> b6989586621680742386)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (FoldMap_6989586621680824187Sym0 :: TyFun (a6989586621680742384 ~> m6989586621680742383) (Last a6989586621680742384 ~> m6989586621680742383) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (Fmap_6989586621680640975Sym0 :: TyFun (a6989586621679962803 ~> b6989586621679962804) (Last a6989586621679962803 ~> Last b6989586621679962804) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

SuppressUnusedWarnings (Foldr_6989586621680824200Sym1 a6989586621680824197 :: TyFun b6989586621680742386 (Last a6989586621680742385 ~> b6989586621680742386) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (Lambda_6989586621680641007Sym0 :: TyFun k (TyFun (k1 ~> Last a) (TyFun k1 (Maybe a) -> Type) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

SuppressUnusedWarnings (FoldMap_6989586621680824187Sym1 a6989586621680824185 :: TyFun (Last a6989586621680742384) m6989586621680742383 -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (TFHelper_6989586621680640987Sym1 a6989586621680640985 b6989586621679962806 :: TyFun (Last b6989586621679962806) (Last a6989586621679962805) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

SuppressUnusedWarnings (TFHelper_6989586621680640963Sym1 a6989586621680640961 :: TyFun (Last a6989586621679962809) (Last b6989586621679962810) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

SuppressUnusedWarnings (Fmap_6989586621680640975Sym1 a6989586621680640973 :: TyFun (Last a6989586621679962803) (Last b6989586621679962804) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

SuppressUnusedWarnings (Traverse_6989586621680995185Sym0 :: TyFun (a6989586621680988964 ~> f6989586621680988963 b6989586621680988965) (Last a6989586621680988964 ~> f6989586621680988963 (Last b6989586621680988965)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

SuppressUnusedWarnings (TFHelper_6989586621680640999Sym1 a6989586621680640997 b6989586621679962833 :: TyFun (a6989586621679962832 ~> Last b6989586621679962833) (Last b6989586621679962833) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

SuppressUnusedWarnings (Traverse_6989586621680995185Sym1 a6989586621680995183 :: TyFun (Last a6989586621680988964) (f6989586621680988963 (Last b6989586621680988965)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

SuppressUnusedWarnings (Foldr_6989586621680824200Sym2 a6989586621680824198 a6989586621680824197 :: TyFun (Last a6989586621680742385) b6989586621680742386 -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (Lambda_6989586621680641007Sym1 a6989586621680641005 :: TyFun (k1 ~> Last a) (TyFun k1 (Maybe a) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Product (arg0 :: Last a0) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Product (arg0 :: Last a0) = Apply (Product_6989586621680743347Sym0 :: TyFun (Last a0) a0 -> Type) arg0
type Sum (arg0 :: Last a0) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Sum (arg0 :: Last a0) = Apply (Sum_6989586621680743334Sym0 :: TyFun (Last a0) a0 -> Type) arg0
type Minimum (arg0 :: Last a0) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Minimum (arg0 :: Last a0) = Apply (Minimum_6989586621680743321Sym0 :: TyFun (Last a0) a0 -> Type) arg0
type Maximum (arg0 :: Last a0) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Maximum (arg0 :: Last a0) = Apply (Maximum_6989586621680743308Sym0 :: TyFun (Last a0) a0 -> Type) arg0
type Length (arg0 :: Last a0) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Length (arg0 :: Last a0) = Apply (Length_6989586621680743270Sym0 :: TyFun (Last a0) Nat -> Type) arg0
type Null (arg0 :: Last a0) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Null (arg0 :: Last a0) = Apply (Null_6989586621680743249Sym0 :: TyFun (Last a0) Bool -> Type) arg0
type ToList (arg0 :: Last a0) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type ToList (arg0 :: Last a0) = Apply (ToList_6989586621680743240Sym0 :: TyFun (Last a0) [a0] -> Type) arg0
type Fold (arg0 :: Last m0) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Fold (arg0 :: Last m0) = Apply (Fold_6989586621680743057Sym0 :: TyFun (Last m0) m0 -> Type) arg0
type Pure (a :: k1) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Pure (a :: k1) = Apply (Pure_6989586621680640953Sym0 :: TyFun k1 (Last k1) -> Type) a
type Return (arg0 :: a0) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Return (arg0 :: a0) = Apply (Return_6989586621679963334Sym0 :: TyFun a0 (Last a0) -> Type) arg0
type Sequence (arg0 :: Last (m0 a0)) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type Sequence (arg0 :: Last (m0 a0)) = Apply (Sequence_6989586621680989026Sym0 :: TyFun (Last (m0 a0)) (m0 (Last a0)) -> Type) arg0
type SequenceA (arg0 :: Last (f0 a0)) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type SequenceA (arg0 :: Last (f0 a0)) = Apply (SequenceA_6989586621680989001Sym0 :: TyFun (Last (f0 a0)) (f0 (Last a0)) -> Type) arg0
type Elem (arg1 :: a0) (arg2 :: Last a0) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Elem (arg1 :: a0) (arg2 :: Last a0) = Apply (Apply (Elem_6989586621680743293Sym0 :: TyFun a0 (Last a0 ~> Bool) -> Type) arg1) arg2
type Foldl1 (arg1 :: a0 ~> (a0 ~> a0)) (arg2 :: Last a0) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Foldl1 (arg1 :: a0 ~> (a0 ~> a0)) (arg2 :: Last a0) = Apply (Apply (Foldl1_6989586621680743216Sym0 :: TyFun (a0 ~> (a0 ~> a0)) (Last a0 ~> a0) -> Type) arg1) arg2
type Foldr1 (arg1 :: a0 ~> (a0 ~> a0)) (arg2 :: Last a0) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Foldr1 (arg1 :: a0 ~> (a0 ~> a0)) (arg2 :: Last a0) = Apply (Apply (Foldr1_6989586621680743191Sym0 :: TyFun (a0 ~> (a0 ~> a0)) (Last a0 ~> a0) -> Type) arg1) arg2
type FoldMap (a1 :: a6989586621680742384 ~> k2) (a2 :: Last a6989586621680742384) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type FoldMap (a1 :: a6989586621680742384 ~> k2) (a2 :: Last a6989586621680742384) = Apply (Apply (FoldMap_6989586621680824187Sym0 :: TyFun (a6989586621680742384 ~> k2) (Last a6989586621680742384 ~> k2) -> Type) a1) a2
type (a1 :: k1) <$ (a2 :: Last b6989586621679962806) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type (a1 :: k1) <$ (a2 :: Last b6989586621679962806) = Apply (Apply (TFHelper_6989586621680640987Sym0 :: TyFun k1 (Last b6989586621679962806 ~> Last k1) -> Type) a1) a2
type Fmap (a1 :: a6989586621679962803 ~> b6989586621679962804) (a2 :: Last a6989586621679962803) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Fmap (a1 :: a6989586621679962803 ~> b6989586621679962804) (a2 :: Last a6989586621679962803) = Apply (Apply (Fmap_6989586621680640975Sym0 :: TyFun (a6989586621679962803 ~> b6989586621679962804) (Last a6989586621679962803 ~> Last b6989586621679962804) -> Type) a1) a2
type (arg1 :: Last a0) <* (arg2 :: Last b0) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type (arg1 :: Last a0) <* (arg2 :: Last b0) = Apply (Apply (TFHelper_6989586621679963287Sym0 :: TyFun (Last a0) (Last b0 ~> Last a0) -> Type) arg1) arg2
type (arg1 :: Last a0) *> (arg2 :: Last b0) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type (arg1 :: Last a0) *> (arg2 :: Last b0) = Apply (Apply (TFHelper_6989586621679963275Sym0 :: TyFun (Last a0) (Last b0 ~> Last b0) -> Type) arg1) arg2
type (a1 :: Last (a6989586621679962809 ~> b6989586621679962810)) <*> (a2 :: Last a6989586621679962809) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type (a1 :: Last (a6989586621679962809 ~> b6989586621679962810)) <*> (a2 :: Last a6989586621679962809) = Apply (Apply (TFHelper_6989586621680640963Sym0 :: TyFun (Last (a6989586621679962809 ~> b6989586621679962810)) (Last a6989586621679962809 ~> Last b6989586621679962810) -> Type) a1) a2
type (arg1 :: Last a0) >> (arg2 :: Last b0) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type (arg1 :: Last a0) >> (arg2 :: Last b0) = Apply (Apply (TFHelper_6989586621679963313Sym0 :: TyFun (Last a0) (Last b0 ~> Last b0) -> Type) arg1) arg2
type (a1 :: Last a6989586621679962832) >>= (a2 :: a6989586621679962832 ~> Last b6989586621679962833) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type (a1 :: Last a6989586621679962832) >>= (a2 :: a6989586621679962832 ~> Last b6989586621679962833) = Apply (Apply (TFHelper_6989586621680640999Sym0 :: TyFun (Last a6989586621679962832) ((a6989586621679962832 ~> Last b6989586621679962833) ~> Last b6989586621679962833) -> Type) a1) a2
type MapM (arg1 :: a0 ~> m0 b0) (arg2 :: Last a0) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type MapM (arg1 :: a0 ~> m0 b0) (arg2 :: Last a0) = Apply (Apply (MapM_6989586621680989011Sym0 :: TyFun (a0 ~> m0 b0) (Last a0 ~> m0 (Last b0)) -> Type) arg1) arg2
type Traverse (a1 :: a6989586621680988964 ~> f6989586621680988963 b6989586621680988965) (a2 :: Last a6989586621680988964) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type Traverse (a1 :: a6989586621680988964 ~> f6989586621680988963 b6989586621680988965) (a2 :: Last a6989586621680988964) = Apply (Apply (Traverse_6989586621680995185Sym0 :: TyFun (a6989586621680988964 ~> f6989586621680988963 b6989586621680988965) (Last a6989586621680988964 ~> f6989586621680988963 (Last b6989586621680988965)) -> Type) a1) a2
type Foldl' (arg1 :: b0 ~> (a0 ~> b0)) (arg2 :: b0) (arg3 :: Last a0) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Foldl' (arg1 :: b0 ~> (a0 ~> b0)) (arg2 :: b0) (arg3 :: Last a0) = Apply (Apply (Apply (Foldl'_6989586621680743162Sym0 :: TyFun (b0 ~> (a0 ~> b0)) (b0 ~> (Last a0 ~> b0)) -> Type) arg1) arg2) arg3
type Foldl (arg1 :: b0 ~> (a0 ~> b0)) (arg2 :: b0) (arg3 :: Last a0) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Foldl (arg1 :: b0 ~> (a0 ~> b0)) (arg2 :: b0) (arg3 :: Last a0) = Apply (Apply (Apply (Foldl_6989586621680743137Sym0 :: TyFun (b0 ~> (a0 ~> b0)) (b0 ~> (Last a0 ~> b0)) -> Type) arg1) arg2) arg3
type Foldr' (arg1 :: a0 ~> (b0 ~> b0)) (arg2 :: b0) (arg3 :: Last a0) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Foldr' (arg1 :: a0 ~> (b0 ~> b0)) (arg2 :: b0) (arg3 :: Last a0) = Apply (Apply (Apply (Foldr'_6989586621680743107Sym0 :: TyFun (a0 ~> (b0 ~> b0)) (b0 ~> (Last a0 ~> b0)) -> Type) arg1) arg2) arg3
type Foldr (a1 :: a6989586621680742385 ~> (k2 ~> k2)) (a2 :: k2) (a3 :: Last a6989586621680742385) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Foldr (a1 :: a6989586621680742385 ~> (k2 ~> k2)) (a2 :: k2) (a3 :: Last a6989586621680742385) = Apply (Apply (Apply (Foldr_6989586621680824200Sym0 :: TyFun (a6989586621680742385 ~> (k2 ~> k2)) (k2 ~> (Last a6989586621680742385 ~> k2)) -> Type) a1) a2) a3
type LiftA2 (arg1 :: a0 ~> (b0 ~> c0)) (arg2 :: Last a0) (arg3 :: Last b0) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type LiftA2 (arg1 :: a0 ~> (b0 ~> c0)) (arg2 :: Last a0) (arg3 :: Last b0) = Apply (Apply (Apply (LiftA2_6989586621679963257Sym0 :: TyFun (a0 ~> (b0 ~> c0)) (Last a0 ~> (Last b0 ~> Last c0)) -> Type) arg1) arg2) arg3
type Apply (Pure_6989586621680640953Sym0 :: TyFun a (Last a) -> Type) (a6989586621680640952 :: a) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (Pure_6989586621680640953Sym0 :: TyFun a (Last a) -> Type) (a6989586621680640952 :: a) = Pure_6989586621680640953 a6989586621680640952
type Apply (Let6989586621680641034BSym0 :: TyFun a6989586621679087417 (Last a6989586621679087417) -> Type) (wild_69895866216806407386989586621680641033 :: a6989586621679087417) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (Let6989586621680641034BSym0 :: TyFun a6989586621679087417 (Last a6989586621679087417) -> Type) (wild_69895866216806407386989586621680641033 :: a6989586621679087417) = Let6989586621680641034B wild_69895866216806407386989586621680641033
type Apply (ShowsPrec_6989586621680637811Sym0 :: TyFun Nat (Last a6989586621679087417 ~> (Symbol ~> Symbol)) -> Type) (a6989586621680637808 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (ShowsPrec_6989586621680637811Sym0 :: TyFun Nat (Last a6989586621679087417 ~> (Symbol ~> Symbol)) -> Type) (a6989586621680637808 :: Nat) = ShowsPrec_6989586621680637811Sym1 a6989586621680637808 a6989586621679087417 :: TyFun (Last a6989586621679087417) (Symbol ~> Symbol) -> Type
type Apply (TFHelper_6989586621680640987Sym0 :: TyFun a6989586621679962805 (Last b6989586621679962806 ~> Last a6989586621679962805) -> Type) (a6989586621680640985 :: a6989586621679962805) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (TFHelper_6989586621680640987Sym0 :: TyFun a6989586621679962805 (Last b6989586621679962806 ~> Last a6989586621679962805) -> Type) (a6989586621680640985 :: a6989586621679962805) = TFHelper_6989586621680640987Sym1 a6989586621680640985 b6989586621679962806 :: TyFun (Last b6989586621679962806) (Last a6989586621679962805) -> Type
type Apply (Foldr_6989586621680824200Sym1 a6989586621680824197 :: TyFun b6989586621680742386 (Last a6989586621680742385 ~> b6989586621680742386) -> Type) (a6989586621680824198 :: b6989586621680742386) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Foldr_6989586621680824200Sym1 a6989586621680824197 :: TyFun b6989586621680742386 (Last a6989586621680742385 ~> b6989586621680742386) -> Type) (a6989586621680824198 :: b6989586621680742386) = Foldr_6989586621680824200Sym2 a6989586621680824197 a6989586621680824198
type Apply (Lambda_6989586621680641007Sym0 :: TyFun k (TyFun (k1 ~> Last a) (TyFun k1 (Maybe a) -> Type) -> Type) -> Type) (a6989586621680641005 :: k) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (Lambda_6989586621680641007Sym0 :: TyFun k (TyFun (k1 ~> Last a) (TyFun k1 (Maybe a) -> Type) -> Type) -> Type) (a6989586621680641005 :: k) = Lambda_6989586621680641007Sym1 a6989586621680641005 :: TyFun (k1 ~> Last a) (TyFun k1 (Maybe a) -> Type) -> Type
type Rep (Last a) 
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 Unwrapped (Last a) 
Instance details

Defined in Control.Lens.Wrapped

type Unwrapped (Last a) = Maybe a
type Sing 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Sing = SLast :: Last a -> Type
type Element (Last a) 
Instance details

Defined in Universum.Container.Class

type Element (Last a) = ElementDefault (Last a)
type Mempty 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Mempty = Mempty_6989586621680641038Sym0 :: Last a
type Demote (Last a) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Demote (Last a) = Last (Demote a)
type Rep1 Last 
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 (arg0 :: [Last a]) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Mconcat (arg0 :: [Last a]) = Apply (Mconcat_6989586621680631303Sym0 :: TyFun [Last a] (Last a) -> Type) arg0
type Show_ (arg0 :: Last a) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Show_ (arg0 :: Last a) = Apply (Show__6989586621680577846Sym0 :: TyFun (Last a) Symbol -> Type) arg0
type Sconcat (arg0 :: NonEmpty (Last a)) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Sconcat (arg0 :: NonEmpty (Last a)) = Apply (Sconcat_6989586621680187691Sym0 :: TyFun (NonEmpty (Last a)) (Last a) -> Type) arg0
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_6989586621680631288Sym0 :: 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_6989586621680577854Sym0 :: 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_6989586621680641026Sym0 :: 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_6989586621679792614Sym0 :: 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_6989586621679792596Sym0 :: 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_6989586621679792578Sym0 :: 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_6989586621679792560Sym0 :: 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_6989586621679792542Sym0 :: 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_6989586621679792524Sym0 :: 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_6989586621680636503Sym0 :: 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_6989586621680635892 a2 b
type HKD Last (a :: Type) 
Instance details

Defined in Data.Vinyl.XRec

type HKD Last (a :: Type) = Last a
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_6989586621680637811Sym0 :: TyFun Nat (Last a1 ~> (Symbol ~> Symbol)) -> Type) a2) a3) a4
type Apply (Compare_6989586621680636503Sym1 a6989586621680636501 :: TyFun (Last a) Ordering -> Type) (a6989586621680636502 :: Last a) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (Compare_6989586621680636503Sym1 a6989586621680636501 :: TyFun (Last a) Ordering -> Type) (a6989586621680636502 :: Last a) = Compare_6989586621680636503 a6989586621680636501 a6989586621680636502
type Apply (FoldMap_6989586621680824187Sym1 a6989586621680824185 :: TyFun (Last a) m -> Type) (a6989586621680824186 :: Last a) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (FoldMap_6989586621680824187Sym1 a6989586621680824185 :: TyFun (Last a) m -> Type) (a6989586621680824186 :: Last a) = FoldMap_6989586621680824187 a6989586621680824185 a6989586621680824186
type Apply (Foldr_6989586621680824200Sym2 a6989586621680824198 a6989586621680824197 :: TyFun (Last a) b -> Type) (a6989586621680824199 :: Last a) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Foldr_6989586621680824200Sym2 a6989586621680824198 a6989586621680824197 :: TyFun (Last a) b -> Type) (a6989586621680824199 :: Last a) = Foldr_6989586621680824200 a6989586621680824198 a6989586621680824197 a6989586621680824199
type Apply (LastSym0 :: TyFun (Maybe a) (Last a) -> Type) (t6989586621680634760 :: Maybe a) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (LastSym0 :: TyFun (Maybe a) (Last a) -> Type) (t6989586621680634760 :: Maybe a) = 'Last t6989586621680634760
type Apply (GetLastSym0 :: TyFun (Last a) (Maybe a) -> Type) (a6989586621680634757 :: Last a) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (GetLastSym0 :: TyFun (Last a) (Maybe a) -> Type) (a6989586621680634757 :: Last a) = GetLast a6989586621680634757
type Apply (TFHelper_6989586621680641026Sym1 a6989586621680641024 :: TyFun (Last a) (Last a) -> Type) (a6989586621680641025 :: Last a) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (TFHelper_6989586621680641026Sym1 a6989586621680641024 :: TyFun (Last a) (Last a) -> Type) (a6989586621680641025 :: Last a) = TFHelper_6989586621680641026 a6989586621680641024 a6989586621680641025
type Apply (TFHelper_6989586621680640963Sym1 a6989586621680640961 :: TyFun (Last a) (Last b) -> Type) (a6989586621680640962 :: Last a) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (TFHelper_6989586621680640963Sym1 a6989586621680640961 :: TyFun (Last a) (Last b) -> Type) (a6989586621680640962 :: Last a) = TFHelper_6989586621680640963 a6989586621680640961 a6989586621680640962
type Apply (Fmap_6989586621680640975Sym1 a6989586621680640973 :: TyFun (Last a) (Last b) -> Type) (a6989586621680640974 :: Last a) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (Fmap_6989586621680640975Sym1 a6989586621680640973 :: TyFun (Last a) (Last b) -> Type) (a6989586621680640974 :: Last a) = Fmap_6989586621680640975 a6989586621680640973 a6989586621680640974
type Apply (TFHelper_6989586621680640987Sym1 a6989586621680640985 b :: TyFun (Last b) (Last a) -> Type) (a6989586621680640986 :: Last b) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (TFHelper_6989586621680640987Sym1 a6989586621680640985 b :: TyFun (Last b) (Last a) -> Type) (a6989586621680640986 :: Last b) = TFHelper_6989586621680640987 a6989586621680640985 a6989586621680640986
type Apply (Traverse_6989586621680995185Sym1 a6989586621680995183 :: TyFun (Last a) (f (Last b)) -> Type) (a6989586621680995184 :: Last a) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type Apply (Traverse_6989586621680995185Sym1 a6989586621680995183 :: TyFun (Last a) (f (Last b)) -> Type) (a6989586621680995184 :: Last a) = Traverse_6989586621680995185 a6989586621680995183 a6989586621680995184
type Apply (Compare_6989586621680636503Sym0 :: TyFun (Last a6989586621679087417) (Last a6989586621679087417 ~> Ordering) -> Type) (a6989586621680636501 :: Last a6989586621679087417) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (Compare_6989586621680636503Sym0 :: TyFun (Last a6989586621679087417) (Last a6989586621679087417 ~> Ordering) -> Type) (a6989586621680636501 :: Last a6989586621679087417) = Compare_6989586621680636503Sym1 a6989586621680636501
type Apply (TFHelper_6989586621680641026Sym0 :: TyFun (Last a6989586621680640722) (Last a6989586621680640722 ~> Last a6989586621680640722) -> Type) (a6989586621680641024 :: Last a6989586621680640722) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (TFHelper_6989586621680641026Sym0 :: TyFun (Last a6989586621680640722) (Last a6989586621680640722 ~> Last a6989586621680640722) -> Type) (a6989586621680641024 :: Last a6989586621680640722) = TFHelper_6989586621680641026Sym1 a6989586621680641024
type Apply (ShowsPrec_6989586621680637811Sym1 a6989586621680637808 a6989586621679087417 :: TyFun (Last a6989586621679087417) (Symbol ~> Symbol) -> Type) (a6989586621680637809 :: Last a6989586621679087417) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (ShowsPrec_6989586621680637811Sym1 a6989586621680637808 a6989586621679087417 :: TyFun (Last a6989586621679087417) (Symbol ~> Symbol) -> Type) (a6989586621680637809 :: Last a6989586621679087417) = ShowsPrec_6989586621680637811Sym2 a6989586621680637808 a6989586621680637809
type Apply (TFHelper_6989586621680640999Sym0 :: TyFun (Last a6989586621679962832) ((a6989586621679962832 ~> Last b6989586621679962833) ~> Last b6989586621679962833) -> Type) (a6989586621680640997 :: Last a6989586621679962832) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (TFHelper_6989586621680640999Sym0 :: TyFun (Last a6989586621679962832) ((a6989586621679962832 ~> Last b6989586621679962833) ~> Last b6989586621679962833) -> Type) (a6989586621680640997 :: Last a6989586621679962832) = TFHelper_6989586621680640999Sym1 a6989586621680640997 b6989586621679962833 :: TyFun (a6989586621679962832 ~> Last b6989586621679962833) (Last b6989586621679962833) -> Type
type Apply (TFHelper_6989586621680640963Sym0 :: TyFun (Last (a6989586621679962809 ~> b6989586621679962810)) (Last a6989586621679962809 ~> Last b6989586621679962810) -> Type) (a6989586621680640961 :: Last (a6989586621679962809 ~> b6989586621679962810)) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (TFHelper_6989586621680640963Sym0 :: TyFun (Last (a6989586621679962809 ~> b6989586621679962810)) (Last a6989586621679962809 ~> Last b6989586621679962810) -> Type) (a6989586621680640961 :: Last (a6989586621679962809 ~> b6989586621679962810)) = TFHelper_6989586621680640963Sym1 a6989586621680640961
type Apply (TFHelper_6989586621680640999Sym1 a6989586621680640997 b :: TyFun (a ~> Last b) (Last b) -> Type) (a6989586621680640998 :: a ~> Last b) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (TFHelper_6989586621680640999Sym1 a6989586621680640997 b :: TyFun (a ~> Last b) (Last b) -> Type) (a6989586621680640998 :: a ~> Last b) = TFHelper_6989586621680640999 a6989586621680640997 a6989586621680640998
type Apply (FoldMap_6989586621680824187Sym0 :: TyFun (a6989586621680742384 ~> m6989586621680742383) (Last a6989586621680742384 ~> m6989586621680742383) -> Type) (a6989586621680824185 :: a6989586621680742384 ~> m6989586621680742383) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (FoldMap_6989586621680824187Sym0 :: TyFun (a6989586621680742384 ~> m6989586621680742383) (Last a6989586621680742384 ~> m6989586621680742383) -> Type) (a6989586621680824185 :: a6989586621680742384 ~> m6989586621680742383) = FoldMap_6989586621680824187Sym1 a6989586621680824185
type Apply (Foldr_6989586621680824200Sym0 :: TyFun (a6989586621680742385 ~> (b6989586621680742386 ~> b6989586621680742386)) (b6989586621680742386 ~> (Last a6989586621680742385 ~> b6989586621680742386)) -> Type) (a6989586621680824197 :: a6989586621680742385 ~> (b6989586621680742386 ~> b6989586621680742386)) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Foldr_6989586621680824200Sym0 :: TyFun (a6989586621680742385 ~> (b6989586621680742386 ~> b6989586621680742386)) (b6989586621680742386 ~> (Last a6989586621680742385 ~> b6989586621680742386)) -> Type) (a6989586621680824197 :: a6989586621680742385 ~> (b6989586621680742386 ~> b6989586621680742386)) = Foldr_6989586621680824200Sym1 a6989586621680824197
type Apply (Fmap_6989586621680640975Sym0 :: TyFun (a6989586621679962803 ~> b6989586621679962804) (Last a6989586621679962803 ~> Last b6989586621679962804) -> Type) (a6989586621680640973 :: a6989586621679962803 ~> b6989586621679962804) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (Fmap_6989586621680640975Sym0 :: TyFun (a6989586621679962803 ~> b6989586621679962804) (Last a6989586621679962803 ~> Last b6989586621679962804) -> Type) (a6989586621680640973 :: a6989586621679962803 ~> b6989586621679962804) = Fmap_6989586621680640975Sym1 a6989586621680640973
type Apply (Traverse_6989586621680995185Sym0 :: TyFun (a6989586621680988964 ~> f6989586621680988963 b6989586621680988965) (Last a6989586621680988964 ~> f6989586621680988963 (Last b6989586621680988965)) -> Type) (a6989586621680995183 :: a6989586621680988964 ~> f6989586621680988963 b6989586621680988965) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type Apply (Traverse_6989586621680995185Sym0 :: TyFun (a6989586621680988964 ~> f6989586621680988963 b6989586621680988965) (Last a6989586621680988964 ~> f6989586621680988963 (Last b6989586621680988965)) -> Type) (a6989586621680995183 :: a6989586621680988964 ~> f6989586621680988963 b6989586621680988965) = Traverse_6989586621680995185Sym1 a6989586621680995183
type Apply (Lambda_6989586621680641007Sym1 a6989586621680641005 :: TyFun (k1 ~> Last a) (TyFun k1 (Maybe a) -> Type) -> Type) (k6989586621680641006 :: k1 ~> Last a) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Apply (Lambda_6989586621680641007Sym1 a6989586621680641005 :: TyFun (k1 ~> Last a) (TyFun k1 (Maybe a) -> Type) -> Type) (k6989586621680641006 :: k1 ~> Last a) = Lambda_6989586621680641007Sym2 a6989586621680641005 k6989586621680641006

stimesMonoid :: (Integral b, Monoid a) => b -> a -> a #

This is a valid definition of stimes for a Monoid.

Unlike the default definition of stimes, it is defined for 0 and so it should be preferred where possible.

stimesIdempotent :: Integral b => b -> a -> a #

This is a valid definition of stimes for an idempotent Semigroup.

When x <> x = x, this definition should be preferred, because it works in O(1) rather than O(log n).

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

Instances details
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 #

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 #

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) #

Representable Dual 
Instance details

Defined in Data.Functor.Rep

Associated Types

type Rep Dual #

Methods

tabulate :: (Rep Dual -> a) -> Dual a #

index :: Dual a -> Rep Dual -> a #

NFData1 Dual

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

liftRnf :: (a -> ()) -> Dual a -> () #

PTraversable Dual 
Instance details

Defined in Data.Singletons.Prelude.Traversable

Associated Types

type Traverse arg0 arg1 :: f0 (t0 b0) #

type SequenceA arg0 :: f0 (t0 a0) #

type MapM arg0 arg1 :: m0 (t0 b0) #

type Sequence arg0 :: m0 (t0 a0) #

STraversable Dual 
Instance details

Defined in Data.Singletons.Prelude.Traversable

Methods

sTraverse :: forall a (f :: Type -> Type) b (t1 :: a ~> f b) (t2 :: Dual a). SApplicative f => Sing t1 -> Sing t2 -> Sing (Apply (Apply TraverseSym0 t1) t2) #

sSequenceA :: forall (f :: Type -> Type) a (t :: Dual (f a)). SApplicative f => Sing t -> Sing (Apply SequenceASym0 t) #

sMapM :: forall a (m :: Type -> Type) b (t1 :: a ~> m b) (t2 :: Dual a). SMonad m => Sing t1 -> Sing t2 -> Sing (Apply (Apply MapMSym0 t1) t2) #

sSequence :: forall (m :: Type -> Type) a (t :: Dual (m a)). SMonad m => Sing t -> Sing (Apply SequenceSym0 t) #

PFoldable Dual 
Instance details

Defined in Data.Singletons.Prelude.Foldable

Associated Types

type Fold arg0 :: m0 #

type FoldMap arg0 arg1 :: m0 #

type Foldr arg0 arg1 arg2 :: b0 #

type Foldr' arg0 arg1 arg2 :: b0 #

type Foldl arg0 arg1 arg2 :: b0 #

type Foldl' arg0 arg1 arg2 :: b0 #

type Foldr1 arg0 arg1 :: a0 #

type Foldl1 arg0 arg1 :: a0 #

type ToList arg0 :: [a0] #

type Null arg0 :: Bool #

type Length arg0 :: Nat #

type Elem arg0 arg1 :: Bool #

type Maximum arg0 :: a0 #

type Minimum arg0 :: a0 #

type Sum arg0 :: a0 #

type Product arg0 :: a0 #

SFoldable Dual 
Instance details

Defined in Data.Singletons.Prelude.Foldable

Methods

sFold :: forall m (t :: Dual m). SMonoid m => Sing t -> Sing (Apply FoldSym0 t) #

sFoldMap :: forall a m (t1 :: a ~> m) (t2 :: Dual a). SMonoid m => Sing t1 -> Sing t2 -> Sing (Apply (Apply FoldMapSym0 t1) t2) #

sFoldr :: forall a b (t1 :: a ~> (b ~> b)) (t2 :: b) (t3 :: Dual a). Sing t1 -> Sing t2 -> Sing t3 -> Sing (Apply (Apply (Apply FoldrSym0 t1) t2) t3) #

sFoldr' :: forall a b (t1 :: a ~> (b ~> b)) (t2 :: b) (t3 :: Dual a). Sing t1 -> Sing t2 -> Sing t3 -> Sing (Apply (Apply (Apply Foldr'Sym0 t1) t2) t3) #

sFoldl :: forall b a (t1 :: b ~> (a ~> b)) (t2 :: b) (t3 :: Dual a). Sing t1 -> Sing t2 -> Sing t3 -> Sing (Apply (Apply (Apply FoldlSym0 t1) t2) t3) #

sFoldl' :: forall b a (t1 :: b ~> (a ~> b)) (t2 :: b) (t3 :: Dual a). Sing t1 -> Sing t2 -> Sing t3 -> Sing (Apply (Apply (Apply Foldl'Sym0 t1) t2) t3) #

sFoldr1 :: forall a (t1 :: a ~> (a ~> a)) (t2 :: Dual a). Sing t1 -> Sing t2 -> Sing (Apply (Apply Foldr1Sym0 t1) t2) #

sFoldl1 :: forall a (t1 :: a ~> (a ~> a)) (t2 :: Dual a). Sing t1 -> Sing t2 -> Sing (Apply (Apply Foldl1Sym0 t1) t2) #

sToList :: forall a (t :: Dual a). Sing t -> Sing (Apply ToListSym0 t) #

sNull :: forall a (t :: Dual a). Sing t -> Sing (Apply NullSym0 t) #

sLength :: forall a (t :: Dual a). Sing t -> Sing (Apply LengthSym0 t) #

sElem :: forall a (t1 :: a) (t2 :: Dual a). SEq a => Sing t1 -> Sing t2 -> Sing (Apply (Apply ElemSym0 t1) t2) #

sMaximum :: forall a (t :: Dual a). SOrd a => Sing t -> Sing (Apply MaximumSym0 t) #

sMinimum :: forall a (t :: Dual a). SOrd a => Sing t -> Sing (Apply MinimumSym0 t) #

sSum :: forall a (t :: Dual a). SNum a => Sing t -> Sing (Apply SumSym0 t) #

sProduct :: forall a (t :: Dual a). SNum a => Sing t -> Sing (Apply ProductSym0 t) #

Unbox a => Vector Vector (Dual a) 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicUnsafeFreeze :: PrimMonad m => Mutable Vector (PrimState m) (Dual a) -> m (Vector (Dual a)) #

basicUnsafeThaw :: PrimMonad m => Vector (Dual a) -> m (Mutable Vector (PrimState m) (Dual a)) #

basicLength :: Vector (Dual a) -> Int #

basicUnsafeSlice :: Int -> Int -> Vector (Dual a) -> Vector (Dual a) #

basicUnsafeIndexM :: Monad m => Vector (Dual a) -> Int -> m (Dual a) #

basicUnsafeCopy :: PrimMonad m => Mutable Vector (PrimState m) (Dual a) -> Vector (Dual a) -> m () #

elemseq :: Vector (Dual a) -> Dual a -> b -> b #

Unbox a => MVector MVector (Dual a) 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicLength :: MVector s (Dual a) -> Int #

basicUnsafeSlice :: Int -> Int -> MVector s (Dual a) -> MVector s (Dual a) #

basicOverlaps :: MVector s (Dual a) -> MVector s (Dual a) -> Bool #

basicUnsafeNew :: PrimMonad m => Int -> m (MVector (PrimState m) (Dual a)) #

basicInitialize :: PrimMonad m => MVector (PrimState m) (Dual a) -> m () #

basicUnsafeReplicate :: PrimMonad m => Int -> Dual a -> m (MVector (PrimState m) (Dual a)) #

basicUnsafeRead :: PrimMonad m => MVector (PrimState m) (Dual a) -> Int -> m (Dual a) #

basicUnsafeWrite :: PrimMonad m => MVector (PrimState m) (Dual a) -> Int -> Dual a -> m () #

basicClear :: PrimMonad m => MVector (PrimState m) (Dual a) -> m () #

basicSet :: PrimMonad m => MVector (PrimState m) (Dual a) -> Dual a -> m () #

basicUnsafeCopy :: PrimMonad m => MVector (PrimState m) (Dual a) -> MVector (PrimState m) (Dual a) -> m () #

basicUnsafeMove :: PrimMonad m => MVector (PrimState m) (Dual a) -> MVector (PrimState m) (Dual a) -> m () #

basicUnsafeGrow :: PrimMonad m => MVector (PrimState m) (Dual a) -> Int -> m (MVector (PrimState m) (Dual a)) #

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 #

Data a => Data (Dual a)

Since: base-4.8.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Dual a -> c (Dual a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Dual a) #

toConstr :: Dual a -> Constr #

dataTypeOf :: Dual a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Dual a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Dual a)) #

gmapT :: (forall b. Data b => b -> b) -> Dual a -> Dual a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Dual a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Dual a -> r #

gmapQ :: (forall d. Data d => d -> u) -> Dual a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Dual a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Dual a -> m (Dual a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Dual a -> m (Dual a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Dual a -> m (Dual a) #

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)

Since: base-4.7.0.0

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 #

NFData a => NFData (Dual a)

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Dual a -> () #

Default a => Default (Dual a) 
Instance details

Defined in Data.Default.Class

Methods

def :: Dual a #

Unbox a => Unbox (Dual a) 
Instance details

Defined in Data.Vector.Unboxed.Base

Wrapped (Dual a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (Dual a) #

Methods

_Wrapped' :: Iso' (Dual a) (Unwrapped (Dual a)) #

Container (Dual a) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element (Dual a) #

Methods

toList :: Dual a -> [Element (Dual a)] #

null :: Dual a -> Bool #

foldr :: (Element (Dual a) -> b -> b) -> b -> Dual a -> b #

foldl :: (b -> Element (Dual a) -> b) -> b -> Dual a -> b #

foldl' :: (b -> Element (Dual a) -> b) -> b -> Dual a -> b #

length :: Dual a -> Int #

elem :: Element (Dual a) -> Dual a -> Bool #

maximum :: Dual a -> Element (Dual a) #

minimum :: Dual a -> Element (Dual a) #

foldMap :: Monoid m => (Element (Dual a) -> m) -> Dual a -> m #

fold :: Dual a -> Element (Dual a) #

foldr' :: (Element (Dual a) -> b -> b) -> b -> Dual a -> b #

foldr1 :: (Element (Dual a) -> Element (Dual a) -> Element (Dual a)) -> Dual a -> Element (Dual a) #

foldl1 :: (Element (Dual a) -> Element (Dual a) -> Element (Dual a)) -> Dual a -> Element (Dual a) #

notElem :: Element (Dual a) -> Dual a -> Bool #

all :: (Element (Dual a) -> Bool) -> Dual a -> Bool #

any :: (Element (Dual a) -> Bool) -> Dual a -> Bool #

and :: Dual a -> Bool #

or :: Dual a -> Bool #

find :: (Element (Dual a) -> Bool) -> Dual a -> Maybe (Element (Dual a)) #

safeHead :: Dual a -> Maybe (Element (Dual a)) #

PMonoid (Dual a) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

Associated Types

type Mempty :: a0 #

type Mappend arg0 arg1 :: a0 #

type Mconcat arg0 :: a0 #

SMonoid a => SMonoid (Dual a) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

Methods

sMempty :: Sing MemptySym0 #

sMappend :: forall (t1 :: Dual a) (t2 :: Dual a). Sing t1 -> Sing t2 -> Sing (Apply (Apply MappendSym0 t1) t2) #

sMconcat :: forall (t :: [Dual a]). Sing t -> Sing (Apply MconcatSym0 t) #

PSemigroup (Dual a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

Associated Types

type arg0 <> arg1 :: a0 #

type Sconcat arg0 :: a0 #

SSemigroup a => SSemigroup (Dual a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

Methods

(%<>) :: forall (t1 :: Dual a) (t2 :: Dual a). Sing t1 -> Sing t2 -> Sing (Apply (Apply (<>@#@$) t1) t2) #

sSconcat :: forall (t :: NonEmpty (Dual a)). Sing t -> Sing (Apply SconcatSym0 t) #

Generic1 Dual

Since: base-4.7.0.0

Instance details

Defined in Data.Semigroup.Internal

Associated Types

type Rep1 Dual :: k -> Type #

Methods

from1 :: forall (a :: k). Dual a -> Rep1 Dual a #

to1 :: forall (a :: k). Rep1 Dual a -> Dual a #

t ~ Dual b => Rewrapped (Dual a) t 
Instance details

Defined in Control.Lens.Wrapped

SDecide a => TestCoercion (SDual :: Dual a -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

Methods

testCoercion :: forall (a0 :: k) (b :: k). SDual a0 -> SDual b -> Maybe (Coercion a0 b) #

SDecide a => TestEquality (SDual :: Dual a -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

Methods

testEquality :: forall (a0 :: k) (b :: k). SDual a0 -> SDual b -> Maybe (a0 :~: b) #

SingI (DualSym0 :: TyFun a (Dual a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

Methods

sing :: Sing DualSym0 #

SuppressUnusedWarnings (ShowsPrec_6989586621681091221Sym0 :: TyFun Nat (Dual a6989586621679087483 ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (Pure_6989586621680215011Sym0 :: TyFun a6989586621679962808 (Dual a6989586621679962808) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (DualSym0 :: TyFun a6989586621679087483 (Dual a6989586621679087483) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (TFHelper_6989586621680215076Sym0 :: TyFun (Dual a6989586621680214881) (Dual a6989586621680214881 ~> Dual a6989586621680214881) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (GetDualSym0 :: TyFun (Dual a6989586621679087483) a6989586621679087483 -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (Compare_6989586621680206604Sym0 :: TyFun (Dual a6989586621679087483) (Dual a6989586621679087483 ~> Ordering) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (TFHelper_6989586621680215045Sym0 :: TyFun a6989586621679962805 (Dual b6989586621679962806 ~> Dual a6989586621679962805) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (TFHelper_6989586621680215076Sym1 a6989586621680215074 :: TyFun (Dual a6989586621680214881) (Dual a6989586621680214881) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (TFHelper_6989586621680215064Sym0 :: TyFun (Dual a6989586621679962832) ((a6989586621679962832 ~> Dual b6989586621679962833) ~> Dual b6989586621679962833) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (Compare_6989586621680206604Sym1 a6989586621680206602 :: TyFun (Dual a6989586621679087483) Ordering -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (ShowsPrec_6989586621681091221Sym1 a6989586621681091218 a6989586621679087483 :: TyFun (Dual a6989586621679087483) (Symbol ~> Symbol) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (TFHelper_6989586621680215021Sym0 :: TyFun (Dual (a6989586621679962809 ~> b6989586621679962810)) (Dual a6989586621679962809 ~> Dual b6989586621679962810) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (Fmap_6989586621680215033Sym0 :: TyFun (a6989586621679962803 ~> b6989586621679962804) (Dual a6989586621679962803 ~> Dual b6989586621679962804) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (TFHelper_6989586621680215045Sym1 a6989586621680215043 b6989586621679962806 :: TyFun (Dual b6989586621679962806) (Dual a6989586621679962805) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (TFHelper_6989586621680215021Sym1 a6989586621680215019 :: TyFun (Dual a6989586621679962809) (Dual b6989586621679962810) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (Fmap_6989586621680215033Sym1 a6989586621680215031 :: TyFun (Dual a6989586621679962803) (Dual b6989586621679962804) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (Traverse_6989586621680995137Sym0 :: TyFun (a6989586621680988964 ~> f6989586621680988963 b6989586621680988965) (Dual a6989586621680988964 ~> f6989586621680988963 (Dual b6989586621680988965)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

SuppressUnusedWarnings (TFHelper_6989586621680215064Sym1 a6989586621680215062 b6989586621679962833 :: TyFun (a6989586621679962832 ~> Dual b6989586621679962833) (Dual b6989586621679962833) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (Traverse_6989586621680995137Sym1 a6989586621680995135 :: TyFun (Dual a6989586621680988964) (f6989586621680988963 (Dual b6989586621680988965)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

SuppressUnusedWarnings (Let6989586621680743148Scrutinee_6989586621680742596Sym0 :: TyFun (a ~> (a6989586621680742384 ~> a)) (TyFun k (TyFun (t6989586621680742381 a6989586621680742384) (Dual (Endo a)) -> Type) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (Let6989586621680743148Scrutinee_6989586621680742596Sym1 f6989586621680743145 :: TyFun k (TyFun (t6989586621680742381 a6989586621680742384) (Dual (Endo a)) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (Let6989586621680743148Scrutinee_6989586621680742596Sym2 z6989586621680743146 f6989586621680743145 :: TyFun (t6989586621680742381 a6989586621680742384) (Dual (Endo a)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Rep Dual 
Instance details

Defined in Data.Functor.Rep

type Rep Dual = ()
type Product (a :: Dual k2) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Product (a :: Dual k2) = Apply (Product_6989586621680743887Sym0 :: 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_6989586621680743894Sym0 :: 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_6989586621680743874Sym0 :: 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_6989586621680743867Sym0 :: TyFun (Dual k2) k2 -> Type) a
type Length (a :: Dual a6989586621680742397) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Length (a :: Dual a6989586621680742397) = Apply (Length_6989586621680743861Sym0 :: TyFun (Dual a6989586621680742397) Nat -> Type) a
type Null (a :: Dual a6989586621680742396) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Null (a :: Dual a6989586621680742396) = Apply (Null_6989586621680743881Sym0 :: TyFun (Dual a6989586621680742396) Bool -> Type) a
type ToList (a :: Dual a6989586621680742395) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type ToList (a :: Dual a6989586621680742395) = Apply (ToList_6989586621680743901Sym0 :: TyFun (Dual a6989586621680742395) [a6989586621680742395] -> Type) a
type Fold (arg0 :: Dual m0) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Fold (arg0 :: Dual m0) = Apply (Fold_6989586621680743057Sym0 :: TyFun (Dual m0) m0 -> Type) arg0
type Pure (a :: k1) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Pure (a :: k1) = Apply (Pure_6989586621680215011Sym0 :: TyFun k1 (Dual k1) -> Type) a
type Return (arg0 :: a0) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Return (arg0 :: a0) = Apply (Return_6989586621679963334Sym0 :: TyFun a0 (Dual a0) -> Type) arg0
type Sequence (arg0 :: Dual (m0 a0)) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type Sequence (arg0 :: Dual (m0 a0)) = Apply (Sequence_6989586621680989026Sym0 :: TyFun (Dual (m0 a0)) (m0 (Dual a0)) -> Type) arg0
type SequenceA (arg0 :: Dual (f0 a0)) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type SequenceA (arg0 :: Dual (f0 a0)) = Apply (SequenceA_6989586621680989001Sym0 :: TyFun (Dual (f0 a0)) (f0 (Dual a0)) -> Type) arg0
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_6989586621680743754Sym0 :: 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_6989586621680743800Sym0 :: 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_6989586621680743851Sym0 :: TyFun (k2 ~> (k2 ~> k2)) (Dual k2 ~> k2) -> Type) a1) a2
type FoldMap (a1 :: a6989586621680742384 ~> k2) (a2 :: Dual a6989586621680742384) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type FoldMap (a1 :: a6989586621680742384 ~> k2) (a2 :: Dual a6989586621680742384) = Apply (Apply (FoldMap_6989586621680743742Sym0 :: TyFun (a6989586621680742384 ~> k2) (Dual a6989586621680742384 ~> k2) -> Type) a1) a2
type (a1 :: k1) <$ (a2 :: Dual b6989586621679962806) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type (a1 :: k1) <$ (a2 :: Dual b6989586621679962806) = Apply (Apply (TFHelper_6989586621680215045Sym0 :: TyFun k1 (Dual b6989586621679962806 ~> Dual k1) -> Type) a1) a2
type Fmap (a1 :: a6989586621679962803 ~> b6989586621679962804) (a2 :: Dual a6989586621679962803) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Fmap (a1 :: a6989586621679962803 ~> b6989586621679962804) (a2 :: Dual a6989586621679962803) = Apply (Apply (Fmap_6989586621680215033Sym0 :: TyFun (a6989586621679962803 ~> b6989586621679962804) (Dual a6989586621679962803 ~> Dual b6989586621679962804) -> Type) a1) a2
type (arg1 :: Dual a0) <* (arg2 :: Dual b0) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type (arg1 :: Dual a0) <* (arg2 :: Dual b0) = Apply (Apply (TFHelper_6989586621679963287Sym0 :: TyFun (Dual a0) (Dual b0 ~> Dual a0) -> Type) arg1) arg2
type (arg1 :: Dual a0) *> (arg2 :: Dual b0) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type (arg1 :: Dual a0) *> (arg2 :: Dual b0) = Apply (Apply (TFHelper_6989586621679963275Sym0 :: TyFun (Dual a0) (Dual b0 ~> Dual b0) -> Type) arg1) arg2
type (a1 :: Dual (a6989586621679962809 ~> b6989586621679962810)) <*> (a2 :: Dual a6989586621679962809) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type (a1 :: Dual (a6989586621679962809 ~> b6989586621679962810)) <*> (a2 :: Dual a6989586621679962809) = Apply (Apply (TFHelper_6989586621680215021Sym0 :: TyFun (Dual (a6989586621679962809 ~> b6989586621679962810)) (Dual a6989586621679962809 ~> Dual b6989586621679962810) -> Type) a1) a2
type (arg1 :: Dual a0) >> (arg2 :: Dual b0) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type (arg1 :: Dual a0) >> (arg2 :: Dual b0) = Apply (Apply (TFHelper_6989586621679963313Sym0 :: TyFun (Dual a0) (Dual b0 ~> Dual b0) -> Type) arg1) arg2
type (a1 :: Dual a6989586621679962832) >>= (a2 :: a6989586621679962832 ~> Dual b6989586621679962833) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type (a1 :: Dual a6989586621679962832) >>= (a2 :: a6989586621679962832 ~> Dual b6989586621679962833) = Apply (Apply (TFHelper_6989586621680215064Sym0 :: TyFun (Dual a6989586621679962832) ((a6989586621679962832 ~> Dual b6989586621679962833) ~> Dual b6989586621679962833) -> Type) a1) a2
type MapM (arg1 :: a0 ~> m0 b0) (arg2 :: Dual a0) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type MapM (arg1 :: a0 ~> m0 b0) (arg2 :: Dual a0) = Apply (Apply (MapM_6989586621680989011Sym0 :: TyFun (a0 ~> m0 b0) (Dual a0 ~> m0 (Dual b0)) -> Type) arg1) arg2
type Traverse (a1 :: a6989586621680988964 ~> f6989586621680988963 b6989586621680988965) (a2 :: Dual a6989586621680988964) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type Traverse (a1 :: a6989586621680988964 ~> f6989586621680988963 b6989586621680988965) (a2 :: Dual a6989586621680988964) = Apply (Apply (Traverse_6989586621680995137Sym0 :: TyFun (a6989586621680988964 ~> f6989586621680988963 b6989586621680988965) (Dual a6989586621680988964 ~> f6989586621680988963 (Dual b6989586621680988965)) -> Type) a1) a2
type Foldl' (a1 :: k2 ~> (a6989586621680742392 ~> k2)) (a2 :: k2) (a3 :: Dual a6989586621680742392) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Foldl' (a1 :: k2 ~> (a6989586621680742392 ~> k2)) (a2 :: k2) (a3 :: Dual a6989586621680742392) = Apply (Apply (Apply (Foldl'_6989586621680743784Sym0 :: TyFun (k2 ~> (a6989586621680742392 ~> k2)) (k2 ~> (Dual a6989586621680742392 ~> k2)) -> Type) a1) a2) a3
type Foldl (a1 :: k2 ~> (a6989586621680742390 ~> k2)) (a2 :: k2) (a3 :: Dual a6989586621680742390) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Foldl (a1 :: k2 ~> (a6989586621680742390 ~> k2)) (a2 :: k2) (a3 :: Dual a6989586621680742390) = Apply (Apply (Apply (Foldl_6989586621680743767Sym0 :: TyFun (k2 ~> (a6989586621680742390 ~> k2)) (k2 ~> (Dual a6989586621680742390 ~> k2)) -> Type) a1) a2) a3
type Foldr' (a1 :: a6989586621680742387 ~> (k2 ~> k2)) (a2 :: k2) (a3 :: Dual a6989586621680742387) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Foldr' (a1 :: a6989586621680742387 ~> (k2 ~> k2)) (a2 :: k2) (a3 :: Dual a6989586621680742387) = Apply (Apply (Apply (Foldr'_6989586621680743829Sym0 :: TyFun (a6989586621680742387 ~> (k2 ~> k2)) (k2 ~> (Dual a6989586621680742387 ~> k2)) -> Type) a1) a2) a3
type Foldr (a1 :: a6989586621680742385 ~> (k2 ~> k2)) (a2 :: k2) (a3 :: Dual a6989586621680742385) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Foldr (a1 :: a6989586621680742385 ~> (k2 ~> k2)) (a2 :: k2) (a3 :: Dual a6989586621680742385) = Apply (Apply (Apply (Foldr_6989586621680743812Sym0 :: TyFun (a6989586621680742385 ~> (k2 ~> k2)) (k2 ~> (Dual a6989586621680742385 ~> k2)) -> Type) a1) a2) a3
type LiftA2 (arg1 :: a0 ~> (b0 ~> c0)) (arg2 :: Dual a0) (arg3 :: Dual b0) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type LiftA2 (arg1 :: a0 ~> (b0 ~> c0)) (arg2 :: Dual a0) (arg3 :: Dual b0) = Apply (Apply (Apply (LiftA2_6989586621679963257Sym0 :: TyFun (a0 ~> (b0 ~> c0)) (Dual a0 ~> (Dual b0 ~> Dual c0)) -> Type) arg1) arg2) arg3
newtype MVector s (Dual a) 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype MVector s (Dual a) = MV_Dual (MVector s a)
type Apply (DualSym0 :: TyFun a (Dual a) -> Type) (t6989586621680197034 :: a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (DualSym0 :: TyFun a (Dual a) -> Type) (t6989586621680197034 :: a) = 'Dual t6989586621680197034
type Apply (Pure_6989586621680215011Sym0 :: TyFun a (Dual a) -> Type) (a6989586621680215010 :: a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (Pure_6989586621680215011Sym0 :: TyFun a (Dual a) -> Type) (a6989586621680215010 :: a) = Pure_6989586621680215011 a6989586621680215010
type Apply (ShowsPrec_6989586621681091221Sym0 :: TyFun Nat (Dual a6989586621679087483 ~> (Symbol ~> Symbol)) -> Type) (a6989586621681091218 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ShowsPrec_6989586621681091221Sym0 :: TyFun Nat (Dual a6989586621679087483 ~> (Symbol ~> Symbol)) -> Type) (a6989586621681091218 :: Nat) = ShowsPrec_6989586621681091221Sym1 a6989586621681091218 a6989586621679087483 :: TyFun (Dual a6989586621679087483) (Symbol ~> Symbol) -> Type
type Apply (TFHelper_6989586621680215045Sym0 :: TyFun a6989586621679962805 (Dual b6989586621679962806 ~> Dual a6989586621679962805) -> Type) (a6989586621680215043 :: a6989586621679962805) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (TFHelper_6989586621680215045Sym0 :: TyFun a6989586621679962805 (Dual b6989586621679962806 ~> Dual a6989586621679962805) -> Type) (a6989586621680215043 :: a6989586621679962805) = TFHelper_6989586621680215045Sym1 a6989586621680215043 b6989586621679962806 :: TyFun (Dual b6989586621679962806) (Dual a6989586621679962805) -> Type
type Apply (Let6989586621680743148Scrutinee_6989586621680742596Sym1 f6989586621680743145 :: TyFun k (TyFun (t6989586621680742381 a6989586621680742384) (Dual (Endo a)) -> Type) -> Type) (z6989586621680743146 :: k) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Let6989586621680743148Scrutinee_6989586621680742596Sym1 f6989586621680743145 :: TyFun k (TyFun (t6989586621680742381 a6989586621680742384) (Dual (Endo a)) -> Type) -> Type) (z6989586621680743146 :: k) = Let6989586621680743148Scrutinee_6989586621680742596Sym2 f6989586621680743145 z6989586621680743146 :: TyFun (t6989586621680742381 a6989586621680742384) (Dual (Endo a)) -> Type
type Rep (Dual a) 
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)))
newtype Vector (Dual a) 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype Vector (Dual a) = V_Dual (Vector a)
type Unwrapped (Dual a) 
Instance details

Defined in Control.Lens.Wrapped

type Unwrapped (Dual a) = a
type Sing 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Sing = SDual :: Dual a -> Type
type Element (Dual a) 
Instance details

Defined in Universum.Container.Class

type Element (Dual a) = ElementDefault (Dual a)
type Mempty 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Mempty = Mempty_6989586621680640852Sym0 :: Dual a
type MaxBound 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type MaxBound = MaxBound_6989586621680201862Sym0 :: Dual a
type MinBound 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type MinBound = MinBound_6989586621680201860Sym0 :: Dual a
type Demote (Dual a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Demote (Dual a) = Dual (Demote a)
type Rep1 Dual 
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 (arg0 :: [Dual a]) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Mconcat (arg0 :: [Dual a]) = Apply (Mconcat_6989586621680631303Sym0 :: TyFun [Dual a] (Dual a) -> Type) arg0
type Show_ (arg0 :: Dual a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Show_ (arg0 :: Dual a) = Apply (Show__6989586621680577846Sym0 :: TyFun (Dual a) Symbol -> Type) arg0
type Sconcat (arg0 :: NonEmpty (Dual a)) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Sconcat (arg0 :: NonEmpty (Dual a)) = Apply (Sconcat_6989586621680187691Sym0 :: TyFun (NonEmpty (Dual a)) (Dual a) -> Type) arg0
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_6989586621680631288Sym0 :: 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_6989586621680577854Sym0 :: 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_6989586621680215076Sym0 :: 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_6989586621679792614Sym0 :: 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_6989586621679792596Sym0 :: 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_6989586621679792578Sym0 :: 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_6989586621679792560Sym0 :: 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_6989586621679792542Sym0 :: 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_6989586621679792524Sym0 :: 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_6989586621680206604Sym0 :: 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_6989586621680203510 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_6989586621681091221Sym0 :: TyFun Nat (Dual a1 ~> (Symbol ~> Symbol)) -> Type) a2) a3) a4
type Apply (GetDualSym0 :: TyFun (Dual a) a -> Type) (a6989586621680197031 :: Dual a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (GetDualSym0 :: TyFun (Dual a) a -> Type) (a6989586621680197031 :: Dual a) = GetDual a6989586621680197031
type Apply (Compare_6989586621680206604Sym1 a6989586621680206602 :: TyFun (Dual a) Ordering -> Type) (a6989586621680206603 :: Dual a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (Compare_6989586621680206604Sym1 a6989586621680206602 :: TyFun (Dual a) Ordering -> Type) (a6989586621680206603 :: Dual a) = Compare_6989586621680206604 a6989586621680206602 a6989586621680206603
type Apply (TFHelper_6989586621680215076Sym1 a6989586621680215074 :: TyFun (Dual a) (Dual a) -> Type) (a6989586621680215075 :: Dual a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (TFHelper_6989586621680215076Sym1 a6989586621680215074 :: TyFun (Dual a) (Dual a) -> Type) (a6989586621680215075 :: Dual a) = TFHelper_6989586621680215076 a6989586621680215074 a6989586621680215075
type Apply (TFHelper_6989586621680215021Sym1 a6989586621680215019 :: TyFun (Dual a) (Dual b) -> Type) (a6989586621680215020 :: Dual a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (TFHelper_6989586621680215021Sym1 a6989586621680215019 :: TyFun (Dual a) (Dual b) -> Type) (a6989586621680215020 :: Dual a) = TFHelper_6989586621680215021 a6989586621680215019 a6989586621680215020
type Apply (Fmap_6989586621680215033Sym1 a6989586621680215031 :: TyFun (Dual a) (Dual b) -> Type) (a6989586621680215032 :: Dual a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (Fmap_6989586621680215033Sym1 a6989586621680215031 :: TyFun (Dual a) (Dual b) -> Type) (a6989586621680215032 :: Dual a) = Fmap_6989586621680215033 a6989586621680215031 a6989586621680215032
type Apply (TFHelper_6989586621680215045Sym1 a6989586621680215043 b :: TyFun (Dual b) (Dual a) -> Type) (a6989586621680215044 :: Dual b) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (TFHelper_6989586621680215045Sym1 a6989586621680215043 b :: TyFun (Dual b) (Dual a) -> Type) (a6989586621680215044 :: Dual b) = TFHelper_6989586621680215045 a6989586621680215043 a6989586621680215044
type Apply (Traverse_6989586621680995137Sym1 a6989586621680995135 :: TyFun (Dual a) (f (Dual b)) -> Type) (a6989586621680995136 :: Dual a) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type Apply (Traverse_6989586621680995137Sym1 a6989586621680995135 :: TyFun (Dual a) (f (Dual b)) -> Type) (a6989586621680995136 :: Dual a) = Traverse_6989586621680995137 a6989586621680995135 a6989586621680995136
type Apply (Let6989586621680743148Scrutinee_6989586621680742596Sym2 z6989586621680743146 f6989586621680743145 :: TyFun (t6989586621680742381 a6989586621680742384) (Dual (Endo a)) -> Type) (t6989586621680743147 :: t6989586621680742381 a6989586621680742384) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Let6989586621680743148Scrutinee_6989586621680742596Sym2 z6989586621680743146 f6989586621680743145 :: TyFun (t6989586621680742381 a6989586621680742384) (Dual (Endo a)) -> Type) (t6989586621680743147 :: t6989586621680742381 a6989586621680742384) = Let6989586621680743148Scrutinee_6989586621680742596 z6989586621680743146 f6989586621680743145 t6989586621680743147
type Apply (Compare_6989586621680206604Sym0 :: TyFun (Dual a6989586621679087483) (Dual a6989586621679087483 ~> Ordering) -> Type) (a6989586621680206602 :: Dual a6989586621679087483) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (Compare_6989586621680206604Sym0 :: TyFun (Dual a6989586621679087483) (Dual a6989586621679087483 ~> Ordering) -> Type) (a6989586621680206602 :: Dual a6989586621679087483) = Compare_6989586621680206604Sym1 a6989586621680206602
type Apply (TFHelper_6989586621680215076Sym0 :: TyFun (Dual a6989586621680214881) (Dual a6989586621680214881 ~> Dual a6989586621680214881) -> Type) (a6989586621680215074 :: Dual a6989586621680214881) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (TFHelper_6989586621680215076Sym0 :: TyFun (Dual a6989586621680214881) (Dual a6989586621680214881 ~> Dual a6989586621680214881) -> Type) (a6989586621680215074 :: Dual a6989586621680214881) = TFHelper_6989586621680215076Sym1 a6989586621680215074
type Apply (TFHelper_6989586621680215064Sym0 :: TyFun (Dual a6989586621679962832) ((a6989586621679962832 ~> Dual b6989586621679962833) ~> Dual b6989586621679962833) -> Type) (a6989586621680215062 :: Dual a6989586621679962832) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (TFHelper_6989586621680215064Sym0 :: TyFun (Dual a6989586621679962832) ((a6989586621679962832 ~> Dual b6989586621679962833) ~> Dual b6989586621679962833) -> Type) (a6989586621680215062 :: Dual a6989586621679962832) = TFHelper_6989586621680215064Sym1 a6989586621680215062 b6989586621679962833 :: TyFun (a6989586621679962832 ~> Dual b6989586621679962833) (Dual b6989586621679962833) -> Type
type Apply (ShowsPrec_6989586621681091221Sym1 a6989586621681091218 a6989586621679087483 :: TyFun (Dual a6989586621679087483) (Symbol ~> Symbol) -> Type) (a6989586621681091219 :: Dual a6989586621679087483) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ShowsPrec_6989586621681091221Sym1 a6989586621681091218 a6989586621679087483 :: TyFun (Dual a6989586621679087483) (Symbol ~> Symbol) -> Type) (a6989586621681091219 :: Dual a6989586621679087483) = ShowsPrec_6989586621681091221Sym2 a6989586621681091218 a6989586621681091219
type Apply (TFHelper_6989586621680215021Sym0 :: TyFun (Dual (a6989586621679962809 ~> b6989586621679962810)) (Dual a6989586621679962809 ~> Dual b6989586621679962810) -> Type) (a6989586621680215019 :: Dual (a6989586621679962809 ~> b6989586621679962810)) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (TFHelper_6989586621680215021Sym0 :: TyFun (Dual (a6989586621679962809 ~> b6989586621679962810)) (Dual a6989586621679962809 ~> Dual b6989586621679962810) -> Type) (a6989586621680215019 :: Dual (a6989586621679962809 ~> b6989586621679962810)) = TFHelper_6989586621680215021Sym1 a6989586621680215019
type Apply (TFHelper_6989586621680215064Sym1 a6989586621680215062 b :: TyFun (a ~> Dual b) (Dual b) -> Type) (a6989586621680215063 :: a ~> Dual b) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (TFHelper_6989586621680215064Sym1 a6989586621680215062 b :: TyFun (a ~> Dual b) (Dual b) -> Type) (a6989586621680215063 :: a ~> Dual b) = TFHelper_6989586621680215064 a6989586621680215062 a6989586621680215063
type Apply (Fmap_6989586621680215033Sym0 :: TyFun (a6989586621679962803 ~> b6989586621679962804) (Dual a6989586621679962803 ~> Dual b6989586621679962804) -> Type) (a6989586621680215031 :: a6989586621679962803 ~> b6989586621679962804) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (Fmap_6989586621680215033Sym0 :: TyFun (a6989586621679962803 ~> b6989586621679962804) (Dual a6989586621679962803 ~> Dual b6989586621679962804) -> Type) (a6989586621680215031 :: a6989586621679962803 ~> b6989586621679962804) = Fmap_6989586621680215033Sym1 a6989586621680215031
type Apply (Traverse_6989586621680995137Sym0 :: TyFun (a6989586621680988964 ~> f6989586621680988963 b6989586621680988965) (Dual a6989586621680988964 ~> f6989586621680988963 (Dual b6989586621680988965)) -> Type) (a6989586621680995135 :: a6989586621680988964 ~> f6989586621680988963 b6989586621680988965) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type Apply (Traverse_6989586621680995137Sym0 :: TyFun (a6989586621680988964 ~> f6989586621680988963 b6989586621680988965) (Dual a6989586621680988964 ~> f6989586621680988963 (Dual b6989586621680988965)) -> Type) (a6989586621680995135 :: a6989586621680988964 ~> f6989586621680988963 b6989586621680988965) = Traverse_6989586621680995137Sym1 a6989586621680995135
type Apply (Let6989586621680743148Scrutinee_6989586621680742596Sym0 :: TyFun (a ~> (a6989586621680742384 ~> a)) (TyFun k (TyFun (t6989586621680742381 a6989586621680742384) (Dual (Endo a)) -> Type) -> Type) -> Type) (f6989586621680743145 :: a ~> (a6989586621680742384 ~> a)) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Let6989586621680743148Scrutinee_6989586621680742596Sym0 :: TyFun (a ~> (a6989586621680742384 ~> a)) (TyFun k (TyFun (t6989586621680742381 a6989586621680742384) (Dual (Endo a)) -> Type) -> Type) -> Type) (f6989586621680743145 :: a ~> (a6989586621680742384 ~> a)) = Let6989586621680743148Scrutinee_6989586621680742596Sym1 f6989586621680743145 :: TyFun k (TyFun (t6989586621680742381 a6989586621680742384) (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

Instances details
Generic (Endo a)

Since: base-4.7.0.0

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 #

Wrapped (Endo a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (Endo a) #

Methods

_Wrapped' :: Iso' (Endo a) (Unwrapped (Endo a)) #

t ~ Endo b => Rewrapped (Endo a) t 
Instance details

Defined in Control.Lens.Wrapped

type Rep (Endo a) 
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))))
type Unwrapped (Endo a) 
Instance details

Defined in Control.Lens.Wrapped

type Unwrapped (Endo a) = 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

Instances details
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 #

Data All

Since: base-4.8.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> All -> c All #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c All #

toConstr :: All -> Constr #

dataTypeOf :: All -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c All) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c All) #

gmapT :: (forall b. Data b => b -> b) -> All -> All #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> All -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> All -> r #

gmapQ :: (forall d. Data d => d -> u) -> All -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> All -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> All -> m All #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> All -> m All #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> All -> m All #

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

Since: base-4.7.0.0

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 #

NFData All

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: All -> () #

Default All 
Instance details

Defined in Data.Default.Class

Methods

def :: All #

Unbox All 
Instance details

Defined in Data.Vector.Unboxed.Base

Wrapped All 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped All #

PMonoid All 
Instance details

Defined in Data.Singletons.Prelude.Monoid

Associated Types

type Mempty :: a0 #

type Mappend arg0 arg1 :: a0 #

type Mconcat arg0 :: a0 #

SMonoid All 
Instance details

Defined in Data.Singletons.Prelude.Monoid

Methods

sMempty :: Sing MemptySym0 #

sMappend :: forall (t1 :: All) (t2 :: All). Sing t1 -> Sing t2 -> Sing (Apply (Apply MappendSym0 t1) t2) #

sMconcat :: forall (t :: [All]). Sing t -> Sing (Apply MconcatSym0 t) #

PSemigroup All 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

Associated Types

type arg0 <> arg1 :: a0 #

type Sconcat arg0 :: a0 #

SSemigroup All 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

Methods

(%<>) :: forall (t1 :: All) (t2 :: All). Sing t1 -> Sing t2 -> Sing (Apply (Apply (<>@#@$) t1) t2) #

sSconcat :: forall (t :: NonEmpty All). Sing t -> Sing (Apply SconcatSym0 t) #

SDecide Bool => TestCoercion SAll 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

Methods

testCoercion :: forall (a :: k) (b :: k). SAll a -> SAll b -> Maybe (Coercion a b) #

SDecide Bool => TestEquality SAll 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

Methods

testEquality :: forall (a :: k) (b :: k). SAll a -> SAll b -> Maybe (a :~: b) #

Vector Vector All 
Instance details

Defined in Data.Vector.Unboxed.Base

t ~ All => Rewrapped All t 
Instance details

Defined in Control.Lens.Wrapped

MVector MVector All 
Instance details

Defined in Data.Vector.Unboxed.Base

SingI AllSym0 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

Methods

sing :: Sing AllSym0 #

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_6989586621681091249Sym0 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings GetAllSym0 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings Compare_6989586621680206622Sym0 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings TFHelper_6989586621680215088Sym0 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (Let6989586621680742866Scrutinee_6989586621680742628Sym0 :: TyFun (t6989586621680742381 Bool) All -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (Compare_6989586621680206622Sym1 a6989586621680206620 :: TyFun All Ordering -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (TFHelper_6989586621680215088Sym1 a6989586621680215086 :: TyFun All All -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (ShowsPrec_6989586621681091249Sym1 a6989586621681091246 :: TyFun All (Symbol ~> Symbol) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (Let6989586621680742834Scrutinee_6989586621680742634Sym0 :: TyFun (a6989586621680742384 ~> Bool) (TyFun (t6989586621680742381 a6989586621680742384) All -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (Let6989586621680742834Scrutinee_6989586621680742634Sym1 p6989586621680742832 :: TyFun (t6989586621680742381 a6989586621680742384) All -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Rep All 
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)))
newtype Vector All 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype Vector All = V_All (Vector Bool)
type Unwrapped All 
Instance details

Defined in Control.Lens.Wrapped

type Sing 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Sing = SAll
type Mempty 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Mempty = Mempty_6989586621680640854Sym0
type MaxBound 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type MaxBound = MaxBound_6989586621680201866Sym0
type MinBound 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type MinBound = MinBound_6989586621680201864Sym0
type Demote All 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Demote All = All
type Mconcat (arg0 :: [All]) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Mconcat (arg0 :: [All]) = Apply (Mconcat_6989586621680631303Sym0 :: TyFun [All] All -> Type) arg0
type Show_ (arg0 :: All) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Show_ (arg0 :: All) = Apply (Show__6989586621680577846Sym0 :: TyFun All Symbol -> Type) arg0
type Sconcat (arg0 :: NonEmpty All) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Sconcat (arg0 :: NonEmpty All) = Apply (Sconcat_6989586621680187691Sym0 :: TyFun (NonEmpty All) All -> Type) arg0
newtype MVector s All 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype MVector s All = MV_All (MVector s Bool)
type Mappend (arg1 :: All) (arg2 :: All) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Mappend (arg1 :: All) (arg2 :: All) = Apply (Apply (Mappend_6989586621680631288Sym0 :: 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_6989586621680577854Sym0 :: 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_6989586621680215088Sym0 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_6989586621679792614Sym0 :: 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_6989586621679792596Sym0 :: 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_6989586621679792578Sym0 :: 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_6989586621679792560Sym0 :: 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_6989586621679792542Sym0 :: 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_6989586621679792524Sym0 :: 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_6989586621680206622Sym0 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_6989586621680203523 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_6989586621681091249Sym0 a1) a2) a3
type Apply All_Sym0 (a6989586621680229712 :: Bool) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply All_Sym0 (a6989586621680229712 :: Bool) = All_ a6989586621680229712
type Apply AllSym0 (t6989586621680197047 :: Bool) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply AllSym0 (t6989586621680197047 :: Bool) = 'All t6989586621680197047
type Apply GetAllSym0 (a6989586621680197044 :: All) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply GetAllSym0 (a6989586621680197044 :: All) = GetAll a6989586621680197044
type Apply (Compare_6989586621680206622Sym1 a6989586621680206620 :: TyFun All Ordering -> Type) (a6989586621680206621 :: All) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (Compare_6989586621680206622Sym1 a6989586621680206620 :: TyFun All Ordering -> Type) (a6989586621680206621 :: All) = Compare_6989586621680206622 a6989586621680206620 a6989586621680206621
type Apply (TFHelper_6989586621680215088Sym1 a6989586621680215086 :: TyFun All All -> Type) (a6989586621680215087 :: All) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (TFHelper_6989586621680215088Sym1 a6989586621680215086 :: TyFun All All -> Type) (a6989586621680215087 :: All) = TFHelper_6989586621680215088 a6989586621680215086 a6989586621680215087
type Apply ShowsPrec_6989586621681091249Sym0 (a6989586621681091246 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply ShowsPrec_6989586621681091249Sym0 (a6989586621681091246 :: Nat) = ShowsPrec_6989586621681091249Sym1 a6989586621681091246
type Apply Compare_6989586621680206622Sym0 (a6989586621680206620 :: All) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply Compare_6989586621680206622Sym0 (a6989586621680206620 :: All) = Compare_6989586621680206622Sym1 a6989586621680206620
type Apply TFHelper_6989586621680215088Sym0 (a6989586621680215086 :: All) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply TFHelper_6989586621680215088Sym0 (a6989586621680215086 :: All) = TFHelper_6989586621680215088Sym1 a6989586621680215086
type Apply (ShowsPrec_6989586621681091249Sym1 a6989586621681091246 :: TyFun All (Symbol ~> Symbol) -> Type) (a6989586621681091247 :: All) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ShowsPrec_6989586621681091249Sym1 a6989586621681091246 :: TyFun All (Symbol ~> Symbol) -> Type) (a6989586621681091247 :: All) = ShowsPrec_6989586621681091249Sym2 a6989586621681091246 a6989586621681091247
type Apply (Let6989586621680742866Scrutinee_6989586621680742628Sym0 :: TyFun (t6989586621680742381 Bool) All -> Type) (x6989586621680742865 :: t6989586621680742381 Bool) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Let6989586621680742866Scrutinee_6989586621680742628Sym0 :: TyFun (t6989586621680742381 Bool) All -> Type) (x6989586621680742865 :: t6989586621680742381 Bool) = Let6989586621680742866Scrutinee_6989586621680742628 x6989586621680742865
type Apply (Let6989586621680742834Scrutinee_6989586621680742634Sym1 p6989586621680742832 :: TyFun (t6989586621680742381 a6989586621680742384) All -> Type) (x6989586621680742833 :: t6989586621680742381 a6989586621680742384) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Let6989586621680742834Scrutinee_6989586621680742634Sym1 p6989586621680742832 :: TyFun (t6989586621680742381 a6989586621680742384) All -> Type) (x6989586621680742833 :: t6989586621680742381 a6989586621680742384) = Let6989586621680742834Scrutinee_6989586621680742634 p6989586621680742832 x6989586621680742833
type Apply (Let6989586621680742834Scrutinee_6989586621680742634Sym0 :: TyFun (a6989586621680742384 ~> Bool) (TyFun (t6989586621680742381 a6989586621680742384) All -> Type) -> Type) (p6989586621680742832 :: a6989586621680742384 ~> Bool) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Let6989586621680742834Scrutinee_6989586621680742634Sym0 :: TyFun (a6989586621680742384 ~> Bool) (TyFun (t6989586621680742381 a6989586621680742384) All -> Type) -> Type) (p6989586621680742832 :: a6989586621680742384 ~> Bool) = Let6989586621680742834Scrutinee_6989586621680742634Sym1 p6989586621680742832 :: TyFun (t6989586621680742381 a6989586621680742384) 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

Instances details
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 #

Data Any

Since: base-4.8.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Any -> c Any #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Any #

toConstr :: Any -> Constr #

dataTypeOf :: Any -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Any) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Any) #

gmapT :: (forall b. Data b => b -> b) -> Any -> Any #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Any -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Any -> r #

gmapQ :: (forall d. Data d => d -> u) -> Any -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Any -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Any -> m Any #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Any -> m Any #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Any -> m Any #

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

Since: base-4.7.0.0

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 #

NFData Any

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Any -> () #

Default Any 
Instance details

Defined in Data.Default.Class

Methods

def :: Any #

Unbox Any 
Instance details

Defined in Data.Vector.Unboxed.Base

Wrapped Any 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped Any #

PMonoid Any 
Instance details

Defined in Data.Singletons.Prelude.Monoid

Associated Types

type Mempty :: a0 #

type Mappend arg0 arg1 :: a0 #

type Mconcat arg0 :: a0 #

SMonoid Any 
Instance details

Defined in Data.Singletons.Prelude.Monoid

Methods

sMempty :: Sing MemptySym0 #

sMappend :: forall (t1 :: Any) (t2 :: Any). Sing t1 -> Sing t2 -> Sing (Apply (Apply MappendSym0 t1) t2) #

sMconcat :: forall (t :: [Any]). Sing t -> Sing (Apply MconcatSym0 t) #

PSemigroup Any 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

Associated Types

type arg0 <> arg1 :: a0 #

type Sconcat arg0 :: a0 #

SSemigroup Any 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

Methods

(%<>) :: forall (t1 :: Any) (t2 :: Any). Sing t1 -> Sing t2 -> Sing (Apply (Apply (<>@#@$) t1) t2) #

sSconcat :: forall (t :: NonEmpty Any). Sing t -> Sing (Apply SconcatSym0 t) #

SDecide Bool => TestCoercion SAny 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

Methods

testCoercion :: forall (a :: k) (b :: k). SAny a -> SAny b -> Maybe (Coercion a b) #

SDecide Bool => TestEquality SAny 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

Methods

testEquality :: forall (a :: k) (b :: k). SAny a -> SAny b -> Maybe (a :~: b) #

Vector Vector Any 
Instance details

Defined in Data.Vector.Unboxed.Base

t ~ Any => Rewrapped Any t 
Instance details

Defined in Control.Lens.Wrapped

MVector MVector Any 
Instance details

Defined in Data.Vector.Unboxed.Base

SingI AnySym0 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

Methods

sing :: Sing AnySym0 #

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_6989586621681091277Sym0 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings GetAnySym0 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings Compare_6989586621680206640Sym0 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings TFHelper_6989586621680215100Sym0 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (Let6989586621680742857Scrutinee_6989586621680742630Sym0 :: TyFun (t6989586621680742381 Bool) Any -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (Compare_6989586621680206640Sym1 a6989586621680206638 :: TyFun Any Ordering -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (TFHelper_6989586621680215100Sym1 a6989586621680215098 :: TyFun Any Any -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (ShowsPrec_6989586621681091277Sym1 a6989586621681091274 :: TyFun Any (Symbol ~> Symbol) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (Let6989586621680742847Scrutinee_6989586621680742632Sym0 :: TyFun (a6989586621680742384 ~> Bool) (TyFun (t6989586621680742381 a6989586621680742384) Any -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (Let6989586621680742847Scrutinee_6989586621680742632Sym1 p6989586621680742845 :: TyFun (t6989586621680742381 a6989586621680742384) Any -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Rep Any 
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)))
newtype Vector Any 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype Vector Any = V_Any (Vector Bool)
type Unwrapped Any 
Instance details

Defined in Control.Lens.Wrapped

type Sing 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Sing = SAny
type Mempty 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Mempty = Mempty_6989586621680640856Sym0
type MaxBound 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type MaxBound = MaxBound_6989586621680201870Sym0
type MinBound 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type MinBound = MinBound_6989586621680201868Sym0
type Demote Any 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Demote Any = Any
type Mconcat (arg0 :: [Any]) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Mconcat (arg0 :: [Any]) = Apply (Mconcat_6989586621680631303Sym0 :: TyFun [Any] Any -> Type) arg0
type Show_ (arg0 :: Any) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Show_ (arg0 :: Any) = Apply (Show__6989586621680577846Sym0 :: TyFun Any Symbol -> Type) arg0
type Sconcat (arg0 :: NonEmpty Any) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Sconcat (arg0 :: NonEmpty Any) = Apply (Sconcat_6989586621680187691Sym0 :: TyFun (NonEmpty Any) Any -> Type) arg0
newtype MVector s Any 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype MVector s Any = MV_Any (MVector s Bool)
type Mappend (arg1 :: Any) (arg2 :: Any) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Mappend (arg1 :: Any) (arg2 :: Any) = Apply (Apply (Mappend_6989586621680631288Sym0 :: 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_6989586621680577854Sym0 :: 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_6989586621680215100Sym0 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_6989586621679792614Sym0 :: 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_6989586621679792596Sym0 :: 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_6989586621679792578Sym0 :: 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_6989586621679792560Sym0 :: 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_6989586621679792542Sym0 :: 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_6989586621679792524Sym0 :: 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_6989586621680206640Sym0 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_6989586621680203533 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_6989586621681091277Sym0 a1) a2) a3
type Apply Any_Sym0 (a6989586621680229711 :: Bool) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply Any_Sym0 (a6989586621680229711 :: Bool) = Any_ a6989586621680229711
type Apply AnySym0 (t6989586621680197060 :: Bool) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply AnySym0 (t6989586621680197060 :: Bool) = 'Any t6989586621680197060
type Apply GetAnySym0 (a6989586621680197057 :: Any) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply GetAnySym0 (a6989586621680197057 :: Any) = GetAny a6989586621680197057
type Apply (Compare_6989586621680206640Sym1 a6989586621680206638 :: TyFun Any Ordering -> Type) (a6989586621680206639 :: Any) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (Compare_6989586621680206640Sym1 a6989586621680206638 :: TyFun Any Ordering -> Type) (a6989586621680206639 :: Any) = Compare_6989586621680206640 a6989586621680206638 a6989586621680206639
type Apply (TFHelper_6989586621680215100Sym1 a6989586621680215098 :: TyFun Any Any -> Type) (a6989586621680215099 :: Any) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (TFHelper_6989586621680215100Sym1 a6989586621680215098 :: TyFun Any Any -> Type) (a6989586621680215099 :: Any) = TFHelper_6989586621680215100 a6989586621680215098 a6989586621680215099
type Apply ShowsPrec_6989586621681091277Sym0 (a6989586621681091274 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply ShowsPrec_6989586621681091277Sym0 (a6989586621681091274 :: Nat) = ShowsPrec_6989586621681091277Sym1 a6989586621681091274
type Apply Compare_6989586621680206640Sym0 (a6989586621680206638 :: Any) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply Compare_6989586621680206640Sym0 (a6989586621680206638 :: Any) = Compare_6989586621680206640Sym1 a6989586621680206638
type Apply TFHelper_6989586621680215100Sym0 (a6989586621680215098 :: Any) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply TFHelper_6989586621680215100Sym0 (a6989586621680215098 :: Any) = TFHelper_6989586621680215100Sym1 a6989586621680215098
type Apply (ShowsPrec_6989586621681091277Sym1 a6989586621681091274 :: TyFun Any (Symbol ~> Symbol) -> Type) (a6989586621681091275 :: Any) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ShowsPrec_6989586621681091277Sym1 a6989586621681091274 :: TyFun Any (Symbol ~> Symbol) -> Type) (a6989586621681091275 :: Any) = ShowsPrec_6989586621681091277Sym2 a6989586621681091274 a6989586621681091275
type Apply (Let6989586621680742857Scrutinee_6989586621680742630Sym0 :: TyFun (t6989586621680742381 Bool) Any -> Type) (x6989586621680742856 :: t6989586621680742381 Bool) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Let6989586621680742857Scrutinee_6989586621680742630Sym0 :: TyFun (t6989586621680742381 Bool) Any -> Type) (x6989586621680742856 :: t6989586621680742381 Bool) = Let6989586621680742857Scrutinee_6989586621680742630 x6989586621680742856
type Apply (Let6989586621680742847Scrutinee_6989586621680742632Sym1 p6989586621680742845 :: TyFun (t6989586621680742381 a6989586621680742384) Any -> Type) (x6989586621680742846 :: t6989586621680742381 a6989586621680742384) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Let6989586621680742847Scrutinee_6989586621680742632Sym1 p6989586621680742845 :: TyFun (t6989586621680742381 a6989586621680742384) Any -> Type) (x6989586621680742846 :: t6989586621680742381 a6989586621680742384) = Let6989586621680742847Scrutinee_6989586621680742632 p6989586621680742845 x6989586621680742846
type Apply (Let6989586621680742847Scrutinee_6989586621680742632Sym0 :: TyFun (a6989586621680742384 ~> Bool) (TyFun (t6989586621680742381 a6989586621680742384) Any -> Type) -> Type) (p6989586621680742845 :: a6989586621680742384 ~> Bool) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Let6989586621680742847Scrutinee_6989586621680742632Sym0 :: TyFun (a6989586621680742384 ~> Bool) (TyFun (t6989586621680742381 a6989586621680742384) Any -> Type) -> Type) (p6989586621680742845 :: a6989586621680742384 ~> Bool) = Let6989586621680742847Scrutinee_6989586621680742632Sym1 p6989586621680742845 :: TyFun (t6989586621680742381 a6989586621680742384) Any -> Type

newtype Sum a #

Monoid under addition.

>>> getSum (Sum 1 <> Sum 2 <> mempty)
3

Constructors

Sum 

Fields

Instances

Instances details
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 #

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 #

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) #

Representable Sum 
Instance details

Defined in Data.Functor.Rep

Associated Types

type Rep Sum #

Methods

tabulate :: (Rep Sum -> a) -> Sum a #

index :: Sum a -> Rep Sum -> a #

NFData1 Sum

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

liftRnf :: (a -> ()) -> Sum a -> () #

PTraversable Sum 
Instance details

Defined in Data.Singletons.Prelude.Traversable

Associated Types

type Traverse arg0 arg1 :: f0 (t0 b0) #

type SequenceA arg0 :: f0 (t0 a0) #

type MapM arg0 arg1 :: m0 (t0 b0) #

type Sequence arg0 :: m0 (t0 a0) #

STraversable Sum 
Instance details

Defined in Data.Singletons.Prelude.Traversable

Methods

sTraverse :: forall a (f :: Type -> Type) b (t1 :: a ~> f b) (t2 :: Sum a). SApplicative f => Sing t1 -> Sing t2 -> Sing (Apply (Apply TraverseSym0 t1) t2) #

sSequenceA :: forall (f :: Type -> Type) a (t :: Sum (f a)). SApplicative f => Sing t -> Sing (Apply SequenceASym0 t) #

sMapM :: forall a (m :: Type -> Type) b (t1 :: a ~> m b) (t2 :: Sum a). SMonad m => Sing t1 -> Sing t2 -> Sing (Apply (Apply MapMSym0 t1) t2) #

sSequence :: forall (m :: Type -> Type) a (t :: Sum (m a)). SMonad m => Sing t -> Sing (Apply SequenceSym0 t) #

PFoldable Sum 
Instance details

Defined in Data.Singletons.Prelude.Foldable

Associated Types

type Fold arg0 :: m0 #

type FoldMap arg0 arg1 :: m0 #

type Foldr arg0 arg1 arg2 :: b0 #

type Foldr' arg0 arg1 arg2 :: b0 #

type Foldl arg0 arg1 arg2 :: b0 #

type Foldl' arg0 arg1 arg2 :: b0 #

type Foldr1 arg0 arg1 :: a0 #

type Foldl1 arg0 arg1 :: a0 #

type ToList arg0 :: [a0] #

type Null arg0 :: Bool #

type Length arg0 :: Nat #

type Elem arg0 arg1 :: Bool #

type Maximum arg0 :: a0 #

type Minimum arg0 :: a0 #

type Sum arg0 :: a0 #

type Product arg0 :: a0 #

SFoldable Sum 
Instance details

Defined in Data.Singletons.Prelude.Foldable

Methods

sFold :: forall m (t :: Sum m). SMonoid m => Sing t -> Sing (Apply FoldSym0 t) #

sFoldMap :: forall a m (t1 :: a ~> m) (t2 :: Sum a). SMonoid m => Sing t1 -> Sing t2 -> Sing (Apply (Apply FoldMapSym0 t1) t2) #

sFoldr :: forall a b (t1 :: a ~> (b ~> b)) (t2 :: b) (t3 :: Sum a). Sing t1 -> Sing t2 -> Sing t3 -> Sing (Apply (Apply (Apply FoldrSym0 t1) t2) t3) #

sFoldr' :: forall a b (t1 :: a ~> (b ~> b)) (t2 :: b) (t3 :: Sum a). Sing t1 -> Sing t2 -> Sing t3 -> Sing (Apply (Apply (Apply Foldr'Sym0 t1) t2) t3) #

sFoldl :: forall b a (t1 :: b ~> (a ~> b)) (t2 :: b) (t3 :: Sum a). Sing t1 -> Sing t2 -> Sing t3 -> Sing (Apply (Apply (Apply FoldlSym0 t1) t2) t3) #

sFoldl' :: forall b a (t1 :: b ~> (a ~> b)) (t2 :: b) (t3 :: Sum a). Sing t1 -> Sing t2 -> Sing t3 -> Sing (Apply (Apply (Apply Foldl'Sym0 t1) t2) t3) #

sFoldr1 :: forall a (t1 :: a ~> (a ~> a)) (t2 :: Sum a). Sing t1 -> Sing t2 -> Sing (Apply (Apply Foldr1Sym0 t1) t2) #

sFoldl1 :: forall a (t1 :: a ~> (a ~> a)) (t2 :: Sum a). Sing t1 -> Sing t2 -> Sing (Apply (Apply Foldl1Sym0 t1) t2) #

sToList :: forall a (t :: Sum a). Sing t -> Sing (Apply ToListSym0 t) #

sNull :: forall a (t :: Sum a). Sing t -> Sing (Apply NullSym0 t) #

sLength :: forall a (t :: Sum a). Sing t -> Sing (Apply LengthSym0 t) #

sElem :: forall a (t1 :: a) (t2 :: Sum a). SEq a => Sing t1 -> Sing t2 -> Sing (Apply (Apply ElemSym0 t1) t2) #

sMaximum :: forall a (t :: Sum a). SOrd a => Sing t -> Sing (Apply MaximumSym0 t) #

sMinimum :: forall a (t :: Sum a). SOrd a => Sing t -> Sing (Apply MinimumSym0 t) #

sSum :: forall a (t :: Sum a). SNum a => Sing t -> Sing (Apply SumSym0 t) #

sProduct :: forall a (t :: Sum a). SNum a => Sing t -> Sing (Apply ProductSym0 t) #

Unbox a => Vector Vector (Sum a) 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicUnsafeFreeze :: PrimMonad m => Mutable Vector (PrimState m) (Sum a) -> m (Vector (Sum a)) #

basicUnsafeThaw :: PrimMonad m => Vector (Sum a) -> m (Mutable Vector (PrimState m) (Sum a)) #

basicLength :: Vector (Sum a) -> Int #

basicUnsafeSlice :: Int -> Int -> Vector (Sum a) -> Vector (Sum a) #

basicUnsafeIndexM :: Monad m => Vector (Sum a) -> Int -> m (Sum a) #

basicUnsafeCopy :: PrimMonad m => Mutable Vector (PrimState m) (Sum a) -> Vector (Sum a) -> m () #

elemseq :: Vector (Sum a) -> Sum a -> b -> b #

Unbox a => MVector MVector (Sum a) 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicLength :: MVector s (Sum a) -> Int #

basicUnsafeSlice :: Int -> Int -> MVector s (Sum a) -> MVector s (Sum a) #

basicOverlaps :: MVector s (Sum a) -> MVector s (Sum a) -> Bool #

basicUnsafeNew :: PrimMonad m => Int -> m (MVector (PrimState m) (Sum a)) #

basicInitialize :: PrimMonad m => MVector (PrimState m) (Sum a) -> m () #

basicUnsafeReplicate :: PrimMonad m => Int -> Sum a -> m (MVector (PrimState m) (Sum a)) #

basicUnsafeRead :: PrimMonad m => MVector (PrimState m) (Sum a) -> Int -> m (Sum a) #

basicUnsafeWrite :: PrimMonad m => MVector (PrimState m) (Sum a) -> Int -> Sum a -> m () #

basicClear :: PrimMonad m => MVector (PrimState m) (Sum a) -> m () #

basicSet :: PrimMonad m => MVector (PrimState m) (Sum a) -> Sum a -> m () #

basicUnsafeCopy :: PrimMonad m => MVector (PrimState m) (Sum a) -> MVector (PrimState m) (Sum a) -> m () #

basicUnsafeMove :: PrimMonad m => MVector (PrimState m) (Sum a) -> MVector (PrimState m) (Sum a) -> m () #

basicUnsafeGrow :: PrimMonad m => MVector (PrimState m) (Sum a) -> Int -> m (MVector (PrimState m) (Sum a)) #

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 #

Data a => Data (Sum a)

Since: base-4.8.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Sum a -> c (Sum a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Sum a) #

toConstr :: Sum a -> Constr #

dataTypeOf :: Sum a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Sum a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Sum a)) #

gmapT :: (forall b. Data b => b -> b) -> Sum a -> Sum a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Sum a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Sum a -> r #

gmapQ :: (forall d. Data d => d -> u) -> Sum a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Sum a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Sum a -> m (Sum a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Sum a -> m (Sum a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Sum a -> m (Sum a) #

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)

Since: base-4.7.0.0

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 #

NFData a => NFData (Sum a)

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Sum a -> () #

Num a => Default (Sum a) 
Instance details

Defined in Data.Default.Class

Methods

def :: Sum a #

Unbox a => Unbox (Sum a) 
Instance details

Defined in Data.Vector.Unboxed.Base

Wrapped (Sum a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (Sum a) #

Methods

_Wrapped' :: Iso' (Sum a) (Unwrapped (Sum a)) #

Container (Sum a) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element (Sum a) #

Methods

toList :: Sum a -> [Element (Sum a)] #

null :: Sum a -> Bool #

foldr :: (Element (Sum a) -> b -> b) -> b -> Sum a -> b #

foldl :: (b -> Element (Sum a) -> b) -> b -> Sum a -> b #

foldl' :: (b -> Element (Sum a) -> b) -> b -> Sum a -> b #

length :: Sum a -> Int #

elem :: Element (Sum a) -> Sum a -> Bool #

maximum :: Sum a -> Element (Sum a) #

minimum :: Sum a -> Element (Sum a) #

foldMap :: Monoid m => (Element (Sum a) -> m) -> Sum a -> m #

fold :: Sum a -> Element (Sum a) #

foldr' :: (Element (Sum a) -> b -> b) -> b -> Sum a -> b #

foldr1 :: (Element (Sum a) -> Element (Sum a) -> Element (Sum a)) -> Sum a -> Element (Sum a) #

foldl1 :: (Element (Sum a) -> Element (Sum a) -> Element (Sum a)) -> Sum a -> Element (Sum a) #

notElem :: Element (Sum a) -> Sum a -> Bool #

all :: (Element (Sum a) -> Bool) -> Sum a -> Bool #

any :: (Element (Sum a) -> Bool) -> Sum a -> Bool #

and :: Sum a -> Bool #

or :: Sum a -> Bool #

find :: (Element (Sum a) -> Bool) -> Sum a -> Maybe (Element (Sum a)) #

safeHead :: Sum a -> Maybe (Element (Sum a)) #

PMonoid (Sum a) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

Associated Types

type Mempty :: a0 #

type Mappend arg0 arg1 :: a0 #

type Mconcat arg0 :: a0 #

SNum a => SMonoid (Sum a) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

Methods

sMempty :: Sing MemptySym0 #

sMappend :: forall (t1 :: Sum a) (t2 :: Sum a). Sing t1 -> Sing t2 -> Sing (Apply (Apply MappendSym0 t1) t2) #

sMconcat :: forall (t :: [Sum a]). Sing t -> Sing (Apply MconcatSym0 t) #

PSemigroup (Sum a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

Associated Types

type arg0 <> arg1 :: a0 #

type Sconcat arg0 :: a0 #

SNum a => SSemigroup (Sum a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

Methods

(%<>) :: forall (t1 :: Sum a) (t2 :: Sum a). Sing t1 -> Sing t2 -> Sing (Apply (Apply (<>@#@$) t1) t2) #

sSconcat :: forall (t :: NonEmpty (Sum a)). Sing t -> Sing (Apply SconcatSym0 t) #

Generic1 Sum

Since: base-4.7.0.0

Instance details

Defined in Data.Semigroup.Internal

Associated Types

type Rep1 Sum :: k -> Type #

Methods

from1 :: forall (a :: k). Sum a -> Rep1 Sum a #

to1 :: forall (a :: k). Rep1 Sum a -> Sum a #

t ~ Sum b => Rewrapped (Sum a) t 
Instance details

Defined in Control.Lens.Wrapped

IsoHKD Sum (a :: Type)

Work with values of type Sum a as if they were of type a.

Instance details

Defined in Data.Vinyl.XRec

Associated Types

type HKD Sum a #

Methods

unHKD :: HKD Sum a -> Sum a #

toHKD :: Sum a -> HKD Sum a #

SDecide a => TestCoercion (SSum :: Sum a -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

Methods

testCoercion :: forall (a0 :: k) (b :: k). SSum a0 -> SSum b -> Maybe (Coercion a0 b) #

SDecide a => TestEquality (SSum :: Sum a -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

Methods

testEquality :: forall (a0 :: k) (b :: k). SSum a0 -> SSum b -> Maybe (a0 :~: b) #

SingI (SumSym0 :: TyFun a (Sum a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

Methods

sing :: Sing SumSym0 #

SuppressUnusedWarnings (FromInteger_6989586621680215244Sym0 :: TyFun Nat (Sum a6989586621680214895) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (ShowsPrec_6989586621681091308Sym0 :: TyFun Nat (Sum a6989586621679087460 ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (Sum_Sym0 :: TyFun a6989586621680230075 (Sum a6989586621680230075) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (SumSym0 :: TyFun a6989586621679087460 (Sum a6989586621679087460) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (Pure_6989586621680215111Sym0 :: TyFun a6989586621679962808 (Sum a6989586621679962808) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (TFHelper_6989586621680215212Sym0 :: TyFun (Sum a6989586621680214895) (Sum a6989586621680214895 ~> Sum a6989586621680214895) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (TFHelper_6989586621680215200Sym0 :: TyFun (Sum a6989586621680214895) (Sum a6989586621680214895 ~> Sum a6989586621680214895) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (TFHelper_6989586621680215188Sym0 :: TyFun (Sum a6989586621680214895) (Sum a6989586621680214895 ~> Sum a6989586621680214895) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (TFHelper_6989586621680215176Sym0 :: TyFun (Sum a6989586621680214892) (Sum a6989586621680214892 ~> Sum a6989586621680214892) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (Signum_6989586621680215237Sym0 :: TyFun (Sum a6989586621680214895) (Sum a6989586621680214895) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (Negate_6989586621680215223Sym0 :: TyFun (Sum a6989586621680214895) (Sum a6989586621680214895) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (GetSumSym0 :: TyFun (Sum a6989586621679087460) a6989586621679087460 -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (Compare_6989586621680206661Sym0 :: TyFun (Sum a6989586621679087460) (Sum a6989586621679087460 ~> Ordering) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (Abs_6989586621680215230Sym0 :: TyFun (Sum a6989586621680214895) (Sum a6989586621680214895) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (Let6989586621680743339Scrutinee_6989586621680742622Sym0 :: TyFun (t6989586621680742381 a6989586621680742384) (Sum a6989586621680742384) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (TFHelper_6989586621680215145Sym0 :: TyFun a6989586621679962805 (Sum b6989586621679962806 ~> Sum a6989586621679962805) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (TFHelper_6989586621680215212Sym1 a6989586621680215210 :: TyFun (Sum a6989586621680214895) (Sum a6989586621680214895) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (TFHelper_6989586621680215200Sym1 a6989586621680215198 :: TyFun (Sum a6989586621680214895) (Sum a6989586621680214895) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (TFHelper_6989586621680215188Sym1 a6989586621680215186 :: TyFun (Sum a6989586621680214895) (Sum a6989586621680214895) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (TFHelper_6989586621680215176Sym1 a6989586621680215174 :: TyFun (Sum a6989586621680214892) (Sum a6989586621680214892) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (TFHelper_6989586621680215164Sym0 :: TyFun (Sum a6989586621679962832) ((a6989586621679962832 ~> Sum b6989586621679962833) ~> Sum b6989586621679962833) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (Compare_6989586621680206661Sym1 a6989586621680206659 :: TyFun (Sum a6989586621679087460) Ordering -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (ShowsPrec_6989586621681091308Sym1 a6989586621681091305 a6989586621679087460 :: TyFun (Sum a6989586621679087460) (Symbol ~> Symbol) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (TFHelper_6989586621680215121Sym0 :: TyFun (Sum (a6989586621679962809 ~> b6989586621679962810)) (Sum a6989586621679962809 ~> Sum b6989586621679962810) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (Fmap_6989586621680215133Sym0 :: TyFun (a6989586621679962803 ~> b6989586621679962804) (Sum a6989586621679962803 ~> Sum b6989586621679962804) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (TFHelper_6989586621680215145Sym1 a6989586621680215143 b6989586621679962806 :: TyFun (Sum b6989586621679962806) (Sum a6989586621679962805) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (TFHelper_6989586621680215121Sym1 a6989586621680215119 :: TyFun (Sum a6989586621679962809) (Sum b6989586621679962810) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (Fmap_6989586621680215133Sym1 a6989586621680215131 :: TyFun (Sum a6989586621679962803) (Sum b6989586621679962804) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (Traverse_6989586621680995149Sym0 :: TyFun (a6989586621680988964 ~> f6989586621680988963 b6989586621680988965) (Sum a6989586621680988964 ~> f6989586621680988963 (Sum b6989586621680988965)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

SuppressUnusedWarnings (TFHelper_6989586621680215164Sym1 a6989586621680215162 b6989586621679962833 :: TyFun (a6989586621679962832 ~> Sum b6989586621679962833) (Sum b6989586621679962833) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (Traverse_6989586621680995149Sym1 a6989586621680995147 :: TyFun (Sum a6989586621680988964) (f6989586621680988963 (Sum b6989586621680988965)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type Rep Sum 
Instance details

Defined in Data.Functor.Rep

type Rep Sum = ()
type Product (a :: Sum k2) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Product (a :: Sum k2) = Apply (Product_6989586621680744054Sym0 :: 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_6989586621680744061Sym0 :: 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_6989586621680744041Sym0 :: 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_6989586621680744034Sym0 :: TyFun (Sum k2) k2 -> Type) a
type Length (a :: Sum a6989586621680742397) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Length (a :: Sum a6989586621680742397) = Apply (Length_6989586621680744028Sym0 :: TyFun (Sum a6989586621680742397) Nat -> Type) a
type Null (a :: Sum a6989586621680742396) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Null (a :: Sum a6989586621680742396) = Apply (Null_6989586621680744048Sym0 :: TyFun (Sum a6989586621680742396) Bool -> Type) a
type ToList (a :: Sum a6989586621680742395) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type ToList (a :: Sum a6989586621680742395) = Apply (ToList_6989586621680744068Sym0 :: TyFun (Sum a6989586621680742395) [a6989586621680742395] -> Type) a
type Fold (arg0 :: Sum m0) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Fold (arg0 :: Sum m0) = Apply (Fold_6989586621680743057Sym0 :: TyFun (Sum m0) m0 -> Type) arg0
type Pure (a :: k1) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Pure (a :: k1) = Apply (Pure_6989586621680215111Sym0 :: TyFun k1 (Sum k1) -> Type) a
type Return (arg0 :: a0) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Return (arg0 :: a0) = Apply (Return_6989586621679963334Sym0 :: TyFun a0 (Sum a0) -> Type) arg0
type Sequence (arg0 :: Sum (m0 a0)) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type Sequence (arg0 :: Sum (m0 a0)) = Apply (Sequence_6989586621680989026Sym0 :: TyFun (Sum (m0 a0)) (m0 (Sum a0)) -> Type) arg0
type SequenceA (arg0 :: Sum (f0 a0)) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type SequenceA (arg0 :: Sum (f0 a0)) = Apply (SequenceA_6989586621680989001Sym0 :: TyFun (Sum (f0 a0)) (f0 (Sum a0)) -> Type) arg0
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_6989586621680743921Sym0 :: 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_6989586621680743967Sym0 :: 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_6989586621680744018Sym0 :: TyFun (k2 ~> (k2 ~> k2)) (Sum k2 ~> k2) -> Type) a1) a2
type FoldMap (a1 :: a6989586621680742384 ~> k2) (a2 :: Sum a6989586621680742384) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type FoldMap (a1 :: a6989586621680742384 ~> k2) (a2 :: Sum a6989586621680742384) = Apply (Apply (FoldMap_6989586621680743909Sym0 :: TyFun (a6989586621680742384 ~> k2) (Sum a6989586621680742384 ~> k2) -> Type) a1) a2
type (a1 :: k1) <$ (a2 :: Sum b6989586621679962806) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type (a1 :: k1) <$ (a2 :: Sum b6989586621679962806) = Apply (Apply (TFHelper_6989586621680215145Sym0 :: TyFun k1 (Sum b6989586621679962806 ~> Sum k1) -> Type) a1) a2
type Fmap (a1 :: a6989586621679962803 ~> b6989586621679962804) (a2 :: Sum a6989586621679962803) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Fmap (a1 :: a6989586621679962803 ~> b6989586621679962804) (a2 :: Sum a6989586621679962803) = Apply (Apply (Fmap_6989586621680215133Sym0 :: TyFun (a6989586621679962803 ~> b6989586621679962804) (Sum a6989586621679962803 ~> Sum b6989586621679962804) -> Type) a1) a2
type (arg1 :: Sum a0) <* (arg2 :: Sum b0) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type (arg1 :: Sum a0) <* (arg2 :: Sum b0) = Apply (Apply (TFHelper_6989586621679963287Sym0 :: TyFun (Sum a0) (Sum b0 ~> Sum a0) -> Type) arg1) arg2
type (arg1 :: Sum a0) *> (arg2 :: Sum b0) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type (arg1 :: Sum a0) *> (arg2 :: Sum b0) = Apply (Apply (TFHelper_6989586621679963275Sym0 :: TyFun (Sum a0) (Sum b0 ~> Sum b0) -> Type) arg1) arg2
type (a1 :: Sum (a6989586621679962809 ~> b6989586621679962810)) <*> (a2 :: Sum a6989586621679962809) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type (a1 :: Sum (a6989586621679962809 ~> b6989586621679962810)) <*> (a2 :: Sum a6989586621679962809) = Apply (Apply (TFHelper_6989586621680215121Sym0 :: TyFun (Sum (a6989586621679962809 ~> b6989586621679962810)) (Sum a6989586621679962809 ~> Sum b6989586621679962810) -> Type) a1) a2
type (arg1 :: Sum a0) >> (arg2 :: Sum b0) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type (arg1 :: Sum a0) >> (arg2 :: Sum b0) = Apply (Apply (TFHelper_6989586621679963313Sym0 :: TyFun (Sum a0) (Sum b0 ~> Sum b0) -> Type) arg1) arg2
type (a1 :: Sum a6989586621679962832) >>= (a2 :: a6989586621679962832 ~> Sum b6989586621679962833) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type (a1 :: Sum a6989586621679962832) >>= (a2 :: a6989586621679962832 ~> Sum b6989586621679962833) = Apply (Apply (TFHelper_6989586621680215164Sym0 :: TyFun (Sum a6989586621679962832) ((a6989586621679962832 ~> Sum b6989586621679962833) ~> Sum b6989586621679962833) -> Type) a1) a2
type MapM (arg1 :: a0 ~> m0 b0) (arg2 :: Sum a0) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type MapM (arg1 :: a0 ~> m0 b0) (arg2 :: Sum a0) = Apply (Apply (MapM_6989586621680989011Sym0 :: TyFun (a0 ~> m0 b0) (Sum a0 ~> m0 (Sum b0)) -> Type) arg1) arg2
type Traverse (a1 :: a6989586621680988964 ~> f6989586621680988963 b6989586621680988965) (a2 :: Sum a6989586621680988964) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type Traverse (a1 :: a6989586621680988964 ~> f6989586621680988963 b6989586621680988965) (a2 :: Sum a6989586621680988964) = Apply (Apply (Traverse_6989586621680995149Sym0 :: TyFun (a6989586621680988964 ~> f6989586621680988963 b6989586621680988965) (Sum a6989586621680988964 ~> f6989586621680988963 (Sum b6989586621680988965)) -> Type) a1) a2
type Foldl' (a1 :: k2 ~> (a6989586621680742392 ~> k2)) (a2 :: k2) (a3 :: Sum a6989586621680742392) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Foldl' (a1 :: k2 ~> (a6989586621680742392 ~> k2)) (a2 :: k2) (a3 :: Sum a6989586621680742392) = Apply (Apply (Apply (Foldl'_6989586621680743951Sym0 :: TyFun (k2 ~> (a6989586621680742392 ~> k2)) (k2 ~> (Sum a6989586621680742392 ~> k2)) -> Type) a1) a2) a3
type Foldl (a1 :: k2 ~> (a6989586621680742390 ~> k2)) (a2 :: k2) (a3 :: Sum a6989586621680742390) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Foldl (a1 :: k2 ~> (a6989586621680742390 ~> k2)) (a2 :: k2) (a3 :: Sum a6989586621680742390) = Apply (Apply (Apply (Foldl_6989586621680743934Sym0 :: TyFun (k2 ~> (a6989586621680742390 ~> k2)) (k2 ~> (Sum a6989586621680742390 ~> k2)) -> Type) a1) a2) a3
type Foldr' (a1 :: a6989586621680742387 ~> (k2 ~> k2)) (a2 :: k2) (a3 :: Sum a6989586621680742387) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Foldr' (a1 :: a6989586621680742387 ~> (k2 ~> k2)) (a2 :: k2) (a3 :: Sum a6989586621680742387) = Apply (Apply (Apply (Foldr'_6989586621680743996Sym0 :: TyFun (a6989586621680742387 ~> (k2 ~> k2)) (k2 ~> (Sum a6989586621680742387 ~> k2)) -> Type) a1) a2) a3
type Foldr (a1 :: a6989586621680742385 ~> (k2 ~> k2)) (a2 :: k2) (a3 :: Sum a6989586621680742385) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Foldr (a1 :: a6989586621680742385 ~> (k2 ~> k2)) (a2 :: k2) (a3 :: Sum a6989586621680742385) = Apply (Apply (Apply (Foldr_6989586621680743979Sym0 :: TyFun (a6989586621680742385 ~> (k2 ~> k2)) (k2 ~> (Sum a6989586621680742385 ~> k2)) -> Type) a1) a2) a3
type LiftA2 (arg1 :: a0 ~> (b0 ~> c0)) (arg2 :: Sum a0) (arg3 :: Sum b0) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type LiftA2 (arg1 :: a0 ~> (b0 ~> c0)) (arg2 :: Sum a0) (arg3 :: Sum b0) = Apply (Apply (Apply (LiftA2_6989586621679963257Sym0 :: TyFun (a0 ~> (b0 ~> c0)) (Sum a0 ~> (Sum b0 ~> Sum c0)) -> Type) arg1) arg2) arg3
newtype MVector s (Sum a) 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype MVector s (Sum a) = MV_Sum (MVector s a)
type Apply (FromInteger_6989586621680215244Sym0 :: TyFun Nat (Sum a6989586621680214895) -> Type) (a6989586621680215243 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (FromInteger_6989586621680215244Sym0 :: TyFun Nat (Sum a6989586621680214895) -> Type) (a6989586621680215243 :: Nat) = FromInteger_6989586621680215244 a6989586621680215243 :: Sum a6989586621680214895
type Apply (SumSym0 :: TyFun a (Sum a) -> Type) (t6989586621680197079 :: a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (SumSym0 :: TyFun a (Sum a) -> Type) (t6989586621680197079 :: a) = 'Sum t6989586621680197079
type Apply (Pure_6989586621680215111Sym0 :: TyFun a (Sum a) -> Type) (a6989586621680215110 :: a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (Pure_6989586621680215111Sym0 :: TyFun a (Sum a) -> Type) (a6989586621680215110 :: a) = Pure_6989586621680215111 a6989586621680215110
type Apply (Sum_Sym0 :: TyFun a (Sum a) -> Type) (a6989586621680229710 :: a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (Sum_Sym0 :: TyFun a (Sum a) -> Type) (a6989586621680229710 :: a) = Sum_ a6989586621680229710
type Apply (ShowsPrec_6989586621681091308Sym0 :: TyFun Nat (Sum a6989586621679087460 ~> (Symbol ~> Symbol)) -> Type) (a6989586621681091305 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ShowsPrec_6989586621681091308Sym0 :: TyFun Nat (Sum a6989586621679087460 ~> (Symbol ~> Symbol)) -> Type) (a6989586621681091305 :: Nat) = ShowsPrec_6989586621681091308Sym1 a6989586621681091305 a6989586621679087460 :: TyFun (Sum a6989586621679087460) (Symbol ~> Symbol) -> Type
type Apply (TFHelper_6989586621680215145Sym0 :: TyFun a6989586621679962805 (Sum b6989586621679962806 ~> Sum a6989586621679962805) -> Type) (a6989586621680215143 :: a6989586621679962805) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (TFHelper_6989586621680215145Sym0 :: TyFun a6989586621679962805 (Sum b6989586621679962806 ~> Sum a6989586621679962805) -> Type) (a6989586621680215143 :: a6989586621679962805) = TFHelper_6989586621680215145Sym1 a6989586621680215143 b6989586621679962806 :: TyFun (Sum b6989586621679962806) (Sum a6989586621679962805) -> Type
type Rep (Sum a) 
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)))
newtype Vector (Sum a) 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype Vector (Sum a) = V_Sum (Vector a)
type Unwrapped (Sum a) 
Instance details

Defined in Control.Lens.Wrapped

type Unwrapped (Sum a) = a
type Sing 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Sing = SSum :: Sum a -> Type
type Element (Sum a) 
Instance details

Defined in Universum.Container.Class

type Element (Sum a) = ElementDefault (Sum a)
type Mempty 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Mempty = Mempty_6989586621680640858Sym0 :: Sum a
type MaxBound 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type MaxBound = MaxBound_6989586621680201877Sym0 :: Sum a
type MinBound 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type MinBound = MinBound_6989586621680201875Sym0 :: Sum a
type Demote (Sum a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Demote (Sum a) = Sum (Demote a)
type Rep1 Sum 
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 (arg0 :: [Sum a]) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Mconcat (arg0 :: [Sum a]) = Apply (Mconcat_6989586621680631303Sym0 :: TyFun [Sum a] (Sum a) -> Type) arg0
type Show_ (arg0 :: Sum a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Show_ (arg0 :: Sum a) = Apply (Show__6989586621680577846Sym0 :: TyFun (Sum a) Symbol -> Type) arg0
type Sconcat (arg0 :: NonEmpty (Sum a)) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Sconcat (arg0 :: NonEmpty (Sum a)) = Apply (Sconcat_6989586621680187691Sym0 :: TyFun (NonEmpty (Sum a)) (Sum a) -> Type) arg0
type FromInteger a2 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type FromInteger a2 = Apply (FromInteger_6989586621680215244Sym0 :: 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_6989586621680215237Sym0 :: 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_6989586621680215230Sym0 :: 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_6989586621680215223Sym0 :: 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_6989586621680631288Sym0 :: 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_6989586621680577854Sym0 :: 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_6989586621680215176Sym0 :: 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_6989586621680215212Sym0 :: 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_6989586621680215200Sym0 :: 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_6989586621680215188Sym0 :: 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_6989586621679792614Sym0 :: 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_6989586621679792596Sym0 :: 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_6989586621679792578Sym0 :: 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_6989586621679792560Sym0 :: 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_6989586621679792542Sym0 :: 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_6989586621679792524Sym0 :: 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_6989586621680206661Sym0 :: 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_6989586621680203544 a2 b
type HKD Sum (a :: Type) 
Instance details

Defined in Data.Vinyl.XRec

type HKD Sum (a :: Type) = a
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_6989586621681091308Sym0 :: TyFun Nat (Sum a1 ~> (Symbol ~> Symbol)) -> Type) a2) a3) a4
type Apply (GetSumSym0 :: TyFun (Sum a) a -> Type) (a6989586621680197076 :: Sum a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (GetSumSym0 :: TyFun (Sum a) a -> Type) (a6989586621680197076 :: Sum a) = GetSum a6989586621680197076
type Apply (Compare_6989586621680206661Sym1 a6989586621680206659 :: TyFun (Sum a) Ordering -> Type) (a6989586621680206660 :: Sum a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (Compare_6989586621680206661Sym1 a6989586621680206659 :: TyFun (Sum a) Ordering -> Type) (a6989586621680206660 :: Sum a) = Compare_6989586621680206661 a6989586621680206659 a6989586621680206660
type Apply (Negate_6989586621680215223Sym0 :: TyFun (Sum a) (Sum a) -> Type) (a6989586621680215222 :: Sum a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (Negate_6989586621680215223Sym0 :: TyFun (Sum a) (Sum a) -> Type) (a6989586621680215222 :: Sum a) = Negate_6989586621680215223 a6989586621680215222
type Apply (Abs_6989586621680215230Sym0 :: TyFun (Sum a) (Sum a) -> Type) (a6989586621680215229 :: Sum a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (Abs_6989586621680215230Sym0 :: TyFun (Sum a) (Sum a) -> Type) (a6989586621680215229 :: Sum a) = Abs_6989586621680215230 a6989586621680215229
type Apply (Signum_6989586621680215237Sym0 :: TyFun (Sum a) (Sum a) -> Type) (a6989586621680215236 :: Sum a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (Signum_6989586621680215237Sym0 :: TyFun (Sum a) (Sum a) -> Type) (a6989586621680215236 :: Sum a) = Signum_6989586621680215237 a6989586621680215236
type Apply (Let6989586621680743339Scrutinee_6989586621680742622Sym0 :: TyFun (t6989586621680742381 a6989586621680742384) (Sum a6989586621680742384) -> Type) (x6989586621680743338 :: t6989586621680742381 a6989586621680742384) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Let6989586621680743339Scrutinee_6989586621680742622Sym0 :: TyFun (t6989586621680742381 a6989586621680742384) (Sum a6989586621680742384) -> Type) (x6989586621680743338 :: t6989586621680742381 a6989586621680742384) = Let6989586621680743339Scrutinee_6989586621680742622 x6989586621680743338
type Apply (TFHelper_6989586621680215176Sym1 a6989586621680215174 :: TyFun (Sum a) (Sum a) -> Type) (a6989586621680215175 :: Sum a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (TFHelper_6989586621680215176Sym1 a6989586621680215174 :: TyFun (Sum a) (Sum a) -> Type) (a6989586621680215175 :: Sum a) = TFHelper_6989586621680215176 a6989586621680215174 a6989586621680215175
type Apply (TFHelper_6989586621680215188Sym1 a6989586621680215186 :: TyFun (Sum a) (Sum a) -> Type) (a6989586621680215187 :: Sum a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (TFHelper_6989586621680215188Sym1 a6989586621680215186 :: TyFun (Sum a) (Sum a) -> Type) (a6989586621680215187 :: Sum a) = TFHelper_6989586621680215188 a6989586621680215186 a6989586621680215187
type Apply (TFHelper_6989586621680215200Sym1 a6989586621680215198 :: TyFun (Sum a) (Sum a) -> Type) (a6989586621680215199 :: Sum a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (TFHelper_6989586621680215200Sym1 a6989586621680215198 :: TyFun (Sum a) (Sum a) -> Type) (a6989586621680215199 :: Sum a) = TFHelper_6989586621680215200 a6989586621680215198 a6989586621680215199
type Apply (TFHelper_6989586621680215212Sym1 a6989586621680215210 :: TyFun (Sum a) (Sum a) -> Type) (a6989586621680215211 :: Sum a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (TFHelper_6989586621680215212Sym1 a6989586621680215210 :: TyFun (Sum a) (Sum a) -> Type) (a6989586621680215211 :: Sum a) = TFHelper_6989586621680215212 a6989586621680215210 a6989586621680215211
type Apply (TFHelper_6989586621680215121Sym1 a6989586621680215119 :: TyFun (Sum a) (Sum b) -> Type) (a6989586621680215120 :: Sum a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (TFHelper_6989586621680215121Sym1 a6989586621680215119 :: TyFun (Sum a) (Sum b) -> Type) (a6989586621680215120 :: Sum a) = TFHelper_6989586621680215121 a6989586621680215119 a6989586621680215120
type Apply (Fmap_6989586621680215133Sym1 a6989586621680215131 :: TyFun (Sum a) (Sum b) -> Type) (a6989586621680215132 :: Sum a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (Fmap_6989586621680215133Sym1 a6989586621680215131 :: TyFun (Sum a) (Sum b) -> Type) (a6989586621680215132 :: Sum a) = Fmap_6989586621680215133 a6989586621680215131 a6989586621680215132
type Apply (TFHelper_6989586621680215145Sym1 a6989586621680215143 b :: TyFun (Sum b) (Sum a) -> Type) (a6989586621680215144 :: Sum b) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (TFHelper_6989586621680215145Sym1 a6989586621680215143 b :: TyFun (Sum b) (Sum a) -> Type) (a6989586621680215144 :: Sum b) = TFHelper_6989586621680215145 a6989586621680215143 a6989586621680215144
type Apply (Traverse_6989586621680995149Sym1 a6989586621680995147 :: TyFun (Sum a) (f (Sum b)) -> Type) (a6989586621680995148 :: Sum a) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type Apply (Traverse_6989586621680995149Sym1 a6989586621680995147 :: TyFun (Sum a) (f (Sum b)) -> Type) (a6989586621680995148 :: Sum a) = Traverse_6989586621680995149 a6989586621680995147 a6989586621680995148
type Apply (Compare_6989586621680206661Sym0 :: TyFun (Sum a6989586621679087460) (Sum a6989586621679087460 ~> Ordering) -> Type) (a6989586621680206659 :: Sum a6989586621679087460) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (Compare_6989586621680206661Sym0 :: TyFun (Sum a6989586621679087460) (Sum a6989586621679087460 ~> Ordering) -> Type) (a6989586621680206659 :: Sum a6989586621679087460) = Compare_6989586621680206661Sym1 a6989586621680206659
type Apply (TFHelper_6989586621680215176Sym0 :: TyFun (Sum a6989586621680214892) (Sum a6989586621680214892 ~> Sum a6989586621680214892) -> Type) (a6989586621680215174 :: Sum a6989586621680214892) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (TFHelper_6989586621680215176Sym0 :: TyFun (Sum a6989586621680214892) (Sum a6989586621680214892 ~> Sum a6989586621680214892) -> Type) (a6989586621680215174 :: Sum a6989586621680214892) = TFHelper_6989586621680215176Sym1 a6989586621680215174
type Apply (TFHelper_6989586621680215188Sym0 :: TyFun (Sum a6989586621680214895) (Sum a6989586621680214895 ~> Sum a6989586621680214895) -> Type) (a6989586621680215186 :: Sum a6989586621680214895) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (TFHelper_6989586621680215188Sym0 :: TyFun (Sum a6989586621680214895) (Sum a6989586621680214895 ~> Sum a6989586621680214895) -> Type) (a6989586621680215186 :: Sum a6989586621680214895) = TFHelper_6989586621680215188Sym1 a6989586621680215186
type Apply (TFHelper_6989586621680215200Sym0 :: TyFun (Sum a6989586621680214895) (Sum a6989586621680214895 ~> Sum a6989586621680214895) -> Type) (a6989586621680215198 :: Sum a6989586621680214895) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (TFHelper_6989586621680215200Sym0 :: TyFun (Sum a6989586621680214895) (Sum a6989586621680214895 ~> Sum a6989586621680214895) -> Type) (a6989586621680215198 :: Sum a6989586621680214895) = TFHelper_6989586621680215200Sym1 a6989586621680215198
type Apply (TFHelper_6989586621680215212Sym0 :: TyFun (Sum a6989586621680214895) (Sum a6989586621680214895 ~> Sum a6989586621680214895) -> Type) (a6989586621680215210 :: Sum a6989586621680214895) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (TFHelper_6989586621680215212Sym0 :: TyFun (Sum a6989586621680214895) (Sum a6989586621680214895 ~> Sum a6989586621680214895) -> Type) (a6989586621680215210 :: Sum a6989586621680214895) = TFHelper_6989586621680215212Sym1 a6989586621680215210
type Apply (TFHelper_6989586621680215164Sym0 :: TyFun (Sum a6989586621679962832) ((a6989586621679962832 ~> Sum b6989586621679962833) ~> Sum b6989586621679962833) -> Type) (a6989586621680215162 :: Sum a6989586621679962832) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (TFHelper_6989586621680215164Sym0 :: TyFun (Sum a6989586621679962832) ((a6989586621679962832 ~> Sum b6989586621679962833) ~> Sum b6989586621679962833) -> Type) (a6989586621680215162 :: Sum a6989586621679962832) = TFHelper_6989586621680215164Sym1 a6989586621680215162 b6989586621679962833 :: TyFun (a6989586621679962832 ~> Sum b6989586621679962833) (Sum b6989586621679962833) -> Type
type Apply (ShowsPrec_6989586621681091308Sym1 a6989586621681091305 a6989586621679087460 :: TyFun (Sum a6989586621679087460) (Symbol ~> Symbol) -> Type) (a6989586621681091306 :: Sum a6989586621679087460) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ShowsPrec_6989586621681091308Sym1 a6989586621681091305 a6989586621679087460 :: TyFun (Sum a6989586621679087460) (Symbol ~> Symbol) -> Type) (a6989586621681091306 :: Sum a6989586621679087460) = ShowsPrec_6989586621681091308Sym2 a6989586621681091305 a6989586621681091306
type Apply (TFHelper_6989586621680215121Sym0 :: TyFun (Sum (a6989586621679962809 ~> b6989586621679962810)) (Sum a6989586621679962809 ~> Sum b6989586621679962810) -> Type) (a6989586621680215119 :: Sum (a6989586621679962809 ~> b6989586621679962810)) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (TFHelper_6989586621680215121Sym0 :: TyFun (Sum (a6989586621679962809 ~> b6989586621679962810)) (Sum a6989586621679962809 ~> Sum b6989586621679962810) -> Type) (a6989586621680215119 :: Sum (a6989586621679962809 ~> b6989586621679962810)) = TFHelper_6989586621680215121Sym1 a6989586621680215119
type Apply (TFHelper_6989586621680215164Sym1 a6989586621680215162 b :: TyFun (a ~> Sum b) (Sum b) -> Type) (a6989586621680215163 :: a ~> Sum b) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (TFHelper_6989586621680215164Sym1 a6989586621680215162 b :: TyFun (a ~> Sum b) (Sum b) -> Type) (a6989586621680215163 :: a ~> Sum b) = TFHelper_6989586621680215164 a6989586621680215162 a6989586621680215163
type Apply (Fmap_6989586621680215133Sym0 :: TyFun (a6989586621679962803 ~> b6989586621679962804) (Sum a6989586621679962803 ~> Sum b6989586621679962804) -> Type) (a6989586621680215131 :: a6989586621679962803 ~> b6989586621679962804) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (Fmap_6989586621680215133Sym0 :: TyFun (a6989586621679962803 ~> b6989586621679962804) (Sum a6989586621679962803 ~> Sum b6989586621679962804) -> Type) (a6989586621680215131 :: a6989586621679962803 ~> b6989586621679962804) = Fmap_6989586621680215133Sym1 a6989586621680215131
type Apply (Traverse_6989586621680995149Sym0 :: TyFun (a6989586621680988964 ~> f6989586621680988963 b6989586621680988965) (Sum a6989586621680988964 ~> f6989586621680988963 (Sum b6989586621680988965)) -> Type) (a6989586621680995147 :: a6989586621680988964 ~> f6989586621680988963 b6989586621680988965) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type Apply (Traverse_6989586621680995149Sym0 :: TyFun (a6989586621680988964 ~> f6989586621680988963 b6989586621680988965) (Sum a6989586621680988964 ~> f6989586621680988963 (Sum b6989586621680988965)) -> Type) (a6989586621680995147 :: a6989586621680988964 ~> f6989586621680988963 b6989586621680988965) = Traverse_6989586621680995149Sym1 a6989586621680995147

newtype Product a #

Monoid under multiplication.

>>> getProduct (Product 3 <> Product 4 <> mempty)
12

Constructors

Product 

Fields

Instances

Instances details
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 #

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 #

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) #

Representable Product 
Instance details

Defined in Data.Functor.Rep

Associated Types

type Rep Product #

Methods

tabulate :: (Rep Product -> a) -> Product a #

index :: Product a -> Rep Product -> a #

NFData1 Product

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

liftRnf :: (a -> ()) -> Product a -> () #

PTraversable Product 
Instance details

Defined in Data.Singletons.Prelude.Traversable

Associated Types

type Traverse arg0 arg1 :: f0 (t0 b0) #

type SequenceA arg0 :: f0 (t0 a0) #

type MapM arg0 arg1 :: m0 (t0 b0) #

type Sequence arg0 :: m0 (t0 a0) #

STraversable Product 
Instance details

Defined in Data.Singletons.Prelude.Traversable

Methods

sTraverse :: forall a (f :: Type -> Type) b (t1 :: a ~> f b) (t2 :: Product a). SApplicative f => Sing t1 -> Sing t2 -> Sing (Apply (Apply TraverseSym0 t1) t2) #

sSequenceA :: forall (f :: Type -> Type) a (t :: Product (f a)). SApplicative f => Sing t -> Sing (Apply SequenceASym0 t) #

sMapM :: forall a (m :: Type -> Type) b (t1 :: a ~> m b) (t2 :: Product a). SMonad m => Sing t1 -> Sing t2 -> Sing (Apply (Apply MapMSym0 t1) t2) #

sSequence :: forall (m :: Type -> Type) a (t :: Product (m a)). SMonad m => Sing t -> Sing (Apply SequenceSym0 t) #

PFoldable Product 
Instance details

Defined in Data.Singletons.Prelude.Foldable

Associated Types

type Fold arg0 :: m0 #

type FoldMap arg0 arg1 :: m0 #

type Foldr arg0 arg1 arg2 :: b0 #

type Foldr' arg0 arg1 arg2 :: b0 #

type Foldl arg0 arg1 arg2 :: b0 #

type Foldl' arg0 arg1 arg2 :: b0 #

type Foldr1 arg0 arg1 :: a0 #

type Foldl1 arg0 arg1 :: a0 #

type ToList arg0 :: [a0] #

type Null arg0 :: Bool #

type Length arg0 :: Nat #

type Elem arg0 arg1 :: Bool #

type Maximum arg0 :: a0 #

type Minimum arg0 :: a0 #

type Sum arg0 :: a0 #

type Product arg0 :: a0 #

SFoldable Product 
Instance details

Defined in Data.Singletons.Prelude.Foldable

Methods

sFold :: forall m (t :: Product m). SMonoid m => Sing t -> Sing (Apply FoldSym0 t) #

sFoldMap :: forall a m (t1 :: a ~> m) (t2 :: Product a). SMonoid m => Sing t1 -> Sing t2 -> Sing (Apply (Apply FoldMapSym0 t1) t2) #

sFoldr :: forall a b (t1 :: a ~> (b ~> b)) (t2 :: b) (t3 :: Product a). Sing t1 -> Sing t2 -> Sing t3 -> Sing (Apply (Apply (Apply FoldrSym0 t1) t2) t3) #

sFoldr' :: forall a b (t1 :: a ~> (b ~> b)) (t2 :: b) (t3 :: Product a). Sing t1 -> Sing t2 -> Sing t3 -> Sing (Apply (Apply (Apply Foldr'Sym0 t1) t2) t3) #

sFoldl :: forall b a (t1 :: b ~> (a ~> b)) (t2 :: b) (t3 :: Product a). Sing t1 -> Sing t2 -> Sing t3 -> Sing (Apply (Apply (Apply FoldlSym0 t1) t2) t3) #

sFoldl' :: forall b a (t1 :: b ~> (a ~> b)) (t2 :: b) (t3 :: Product a). Sing t1 -> Sing t2 -> Sing t3 -> Sing (Apply (Apply (Apply Foldl'Sym0 t1) t2) t3) #

sFoldr1 :: forall a (t1 :: a ~> (a ~> a)) (t2 :: Product a). Sing t1 -> Sing t2 -> Sing (Apply (Apply Foldr1Sym0 t1) t2) #

sFoldl1 :: forall a (t1 :: a ~> (a ~> a)) (t2 :: Product a). Sing t1 -> Sing t2 -> Sing (Apply (Apply Foldl1Sym0 t1) t2) #

sToList :: forall a (t :: Product a). Sing t -> Sing (Apply ToListSym0 t) #

sNull :: forall a (t :: Product a). Sing t -> Sing (Apply NullSym0 t) #

sLength :: forall a (t :: Product a). Sing t -> Sing (Apply LengthSym0 t) #

sElem :: forall a (t1 :: a) (t2 :: Product a). SEq a => Sing t1 -> Sing t2 -> Sing (Apply (Apply ElemSym0 t1) t2) #

sMaximum :: forall a (t :: Product a). SOrd a => Sing t -> Sing (Apply MaximumSym0 t) #

sMinimum :: forall a (t :: Product a). SOrd a => Sing t -> Sing (Apply MinimumSym0 t) #

sSum :: forall a (t :: Product a). SNum a => Sing t -> Sing (Apply SumSym0 t) #

sProduct :: forall a (t :: Product a). SNum a => Sing t -> Sing (Apply ProductSym0 t) #

Unbox a => Vector Vector (Product a) 
Instance details

Defined in Data.Vector.Unboxed.Base

Unbox a => MVector MVector (Product a) 
Instance details

Defined in Data.Vector.Unboxed.Base

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 #

Data a => Data (Product a)

Since: base-4.8.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Product a -> c (Product a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Product a) #

toConstr :: Product a -> Constr #

dataTypeOf :: Product a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Product a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Product a)) #

gmapT :: (forall b. Data b => b -> b) -> Product a -> Product a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Product a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Product a -> r #

gmapQ :: (forall d. Data d => d -> u) -> Product a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Product a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Product a -> m (Product a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Product a -> m (Product a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Product a -> m (Product a) #

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)

Since: base-4.7.0.0

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 #

NFData a => NFData (Product a)

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Product a -> () #

Num a => Default (Product a) 
Instance details

Defined in Data.Default.Class

Methods

def :: Product a #

Unbox a => Unbox (Product a) 
Instance details

Defined in Data.Vector.Unboxed.Base

Wrapped (Product a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (Product a) #

Methods

_Wrapped' :: Iso' (Product a) (Unwrapped (Product a)) #

Container (Product a) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element (Product a) #

Methods

toList :: Product a -> [Element (Product a)] #

null :: Product a -> Bool #

foldr :: (Element (Product a) -> b -> b) -> b -> Product a -> b #

foldl :: (b -> Element (Product a) -> b) -> b -> Product a -> b #

foldl' :: (b -> Element (Product a) -> b) -> b -> Product a -> b #

length :: Product a -> Int #

elem :: Element (Product a) -> Product a -> Bool #

maximum :: Product a -> Element (Product a) #

minimum :: Product a -> Element (Product a) #

foldMap :: Monoid m => (Element (Product a) -> m) -> Product a -> m #

fold :: Product a -> Element (Product a) #

foldr' :: (Element (Product a) -> b -> b) -> b -> Product a -> b #

foldr1 :: (Element (Product a) -> Element (Product a) -> Element (Product a)) -> Product a -> Element (Product a) #

foldl1 :: (Element (Product a) -> Element (Product a) -> Element (Product a)) -> Product a -> Element (Product a) #

notElem :: Element (Product a) -> Product a -> Bool #

all :: (Element (Product a) -> Bool) -> Product a -> Bool #

any :: (Element (Product a) -> Bool) -> Product a -> Bool #

and :: Product a -> Bool #

or :: Product a -> Bool #

find :: (Element (Product a) -> Bool) -> Product a -> Maybe (Element (Product a)) #

safeHead :: Product a -> Maybe (Element (Product a)) #

PMonoid (Product a) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

Associated Types

type Mempty :: a0 #

type Mappend arg0 arg1 :: a0 #

type Mconcat arg0 :: a0 #

SNum a => SMonoid (Product a) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

Methods

sMempty :: Sing MemptySym0 #

sMappend :: forall (t1 :: Product a) (t2 :: Product a). Sing t1 -> Sing t2 -> Sing (Apply (Apply MappendSym0 t1) t2) #

sMconcat :: forall (t :: [Product a]). Sing t -> Sing (Apply MconcatSym0 t) #

PSemigroup (Product a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

Associated Types

type arg0 <> arg1 :: a0 #

type Sconcat arg0 :: a0 #

SNum a => SSemigroup (Product a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

Methods

(%<>) :: forall (t1 :: Product a) (t2 :: Product a). Sing t1 -> Sing t2 -> Sing (Apply (Apply (<>@#@$) t1) t2) #

sSconcat :: forall (t :: NonEmpty (Product a)). Sing t -> Sing (Apply SconcatSym0 t) #

Generic1 Product

Since: base-4.7.0.0

Instance details

Defined in Data.Semigroup.Internal

Associated Types

type Rep1 Product :: k -> Type #

Methods

from1 :: forall (a :: k). Product a -> Rep1 Product a #

to1 :: forall (a :: k). Rep1 Product a -> Product a #

t ~ Product b => Rewrapped (Product a) t 
Instance details

Defined in Control.Lens.Wrapped

IsoHKD Product (a :: Type)

Work with values of type Product a as if they were of type a.

Instance details

Defined in Data.Vinyl.XRec

Associated Types

type HKD Product a #

Methods

unHKD :: HKD Product a -> Product a #

toHKD :: Product a -> HKD Product a #

SDecide a => TestCoercion (SProduct :: Product a -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

Methods

testCoercion :: forall (a0 :: k) (b :: k). SProduct a0 -> SProduct b -> Maybe (Coercion a0 b) #

SDecide a => TestEquality (SProduct :: Product a -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

Methods

testEquality :: forall (a0 :: k) (b :: k). SProduct a0 -> SProduct b -> Maybe (a0 :~: b) #

SingI (ProductSym0 :: TyFun a (Product a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (FromInteger_6989586621680215384Sym0 :: TyFun Nat (Product a6989586621680214913) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (ShowsPrec_6989586621681091339Sym0 :: TyFun Nat (Product a6989586621679087468 ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (Pure_6989586621680215251Sym0 :: TyFun a6989586621679962808 (Product a6989586621679962808) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (Product_Sym0 :: TyFun a6989586621680230083 (Product a6989586621680230083) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (ProductSym0 :: TyFun a6989586621679087468 (Product a6989586621679087468) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (TFHelper_6989586621680215352Sym0 :: TyFun (Product a6989586621680214913) (Product a6989586621680214913 ~> Product a6989586621680214913) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (TFHelper_6989586621680215340Sym0 :: TyFun (Product a6989586621680214913) (Product a6989586621680214913 ~> Product a6989586621680214913) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (TFHelper_6989586621680215328Sym0 :: TyFun (Product a6989586621680214913) (Product a6989586621680214913 ~> Product a6989586621680214913) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (TFHelper_6989586621680215316Sym0 :: TyFun (Product a6989586621680214910) (Product a6989586621680214910 ~> Product a6989586621680214910) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (Signum_6989586621680215377Sym0 :: TyFun (Product a6989586621680214913) (Product a6989586621680214913) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (Negate_6989586621680215363Sym0 :: TyFun (Product a6989586621680214913) (Product a6989586621680214913) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (GetProductSym0 :: TyFun (Product a6989586621679087468) a6989586621679087468 -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (Compare_6989586621680206682Sym0 :: TyFun (Product a6989586621679087468) (Product a6989586621679087468 ~> Ordering) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (Abs_6989586621680215370Sym0 :: TyFun (Product a6989586621680214913) (Product a6989586621680214913) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (Let6989586621680743352Scrutinee_6989586621680742625Sym0 :: TyFun (t6989586621680742381 a6989586621680742384) (Product a6989586621680742384) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

SuppressUnusedWarnings (TFHelper_6989586621680215285Sym0 :: TyFun a6989586621679962805 (Product b6989586621679962806 ~> Product a6989586621679962805) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (TFHelper_6989586621680215352Sym1 a6989586621680215350 :: TyFun (Product a6989586621680214913) (Product a6989586621680214913) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (TFHelper_6989586621680215340Sym1 a6989586621680215338 :: TyFun (Product a6989586621680214913) (Product a6989586621680214913) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (TFHelper_6989586621680215328Sym1 a6989586621680215326 :: TyFun (Product a6989586621680214913) (Product a6989586621680214913) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (TFHelper_6989586621680215316Sym1 a6989586621680215314 :: TyFun (Product a6989586621680214910) (Product a6989586621680214910) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (TFHelper_6989586621680215304Sym0 :: TyFun (Product a6989586621679962832) ((a6989586621679962832 ~> Product b6989586621679962833) ~> Product b6989586621679962833) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (Compare_6989586621680206682Sym1 a6989586621680206680 :: TyFun (Product a6989586621679087468) Ordering -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (ShowsPrec_6989586621681091339Sym1 a6989586621681091336 a6989586621679087468 :: TyFun (Product a6989586621679087468) (Symbol ~> Symbol) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

SuppressUnusedWarnings (TFHelper_6989586621680215261Sym0 :: TyFun (Product (a6989586621679962809 ~> b6989586621679962810)) (Product a6989586621679962809 ~> Product b6989586621679962810) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (Fmap_6989586621680215273Sym0 :: TyFun (a6989586621679962803 ~> b6989586621679962804) (Product a6989586621679962803 ~> Product b6989586621679962804) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (TFHelper_6989586621680215285Sym1 a6989586621680215283 b6989586621679962806 :: TyFun (Product b6989586621679962806) (Product a6989586621679962805) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (TFHelper_6989586621680215261Sym1 a6989586621680215259 :: TyFun (Product a6989586621679962809) (Product b6989586621679962810) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (Fmap_6989586621680215273Sym1 a6989586621680215271 :: TyFun (Product a6989586621679962803) (Product b6989586621679962804) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (Traverse_6989586621680995161Sym0 :: TyFun (a6989586621680988964 ~> f6989586621680988963 b6989586621680988965) (Product a6989586621680988964 ~> f6989586621680988963 (Product b6989586621680988965)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

SuppressUnusedWarnings (TFHelper_6989586621680215304Sym1 a6989586621680215302 b6989586621679962833 :: TyFun (a6989586621679962832 ~> Product b6989586621679962833) (Product b6989586621679962833) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (Traverse_6989586621680995161Sym1 a6989586621680995159 :: TyFun (Product a6989586621680988964) (f6989586621680988963 (Product b6989586621680988965)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type Rep Product 
Instance details

Defined in Data.Functor.Rep

type Rep Product = ()
type Product (a :: Product k2) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Product (a :: Product k2) = Apply (Product_6989586621680744221Sym0 :: 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_6989586621680744228Sym0 :: 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_6989586621680744208Sym0 :: 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_6989586621680744201Sym0 :: TyFun (Product k2) k2 -> Type) a
type Length (a :: Product a6989586621680742397) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Length (a :: Product a6989586621680742397) = Apply (Length_6989586621680744195Sym0 :: TyFun (Product a6989586621680742397) Nat -> Type) a
type Null (a :: Product a6989586621680742396) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Null (a :: Product a6989586621680742396) = Apply (Null_6989586621680744215Sym0 :: TyFun (Product a6989586621680742396) Bool -> Type) a
type ToList (a :: Product a6989586621680742395) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type ToList (a :: Product a6989586621680742395) = Apply (ToList_6989586621680744235Sym0 :: TyFun (Product a6989586621680742395) [a6989586621680742395] -> Type) a
type Fold (arg0 :: Product m0) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Fold (arg0 :: Product m0) = Apply (Fold_6989586621680743057Sym0 :: TyFun (Product m0) m0 -> Type) arg0
type Pure (a :: k1) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Pure (a :: k1) = Apply (Pure_6989586621680215251Sym0 :: TyFun k1 (Product k1) -> Type) a
type Return (arg0 :: a0) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Return (arg0 :: a0) = Apply (Return_6989586621679963334Sym0 :: TyFun a0 (Product a0) -> Type) arg0
type Sequence (arg0 :: Product (m0 a0)) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type Sequence (arg0 :: Product (m0 a0)) = Apply (Sequence_6989586621680989026Sym0 :: TyFun (Product (m0 a0)) (m0 (Product a0)) -> Type) arg0
type SequenceA (arg0 :: Product (f0 a0)) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type SequenceA (arg0 :: Product (f0 a0)) = Apply (SequenceA_6989586621680989001Sym0 :: TyFun (Product (f0 a0)) (f0 (Product a0)) -> Type) arg0
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_6989586621680744088Sym0 :: 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_6989586621680744134Sym0 :: 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_6989586621680744185Sym0 :: TyFun (k2 ~> (k2 ~> k2)) (Product k2 ~> k2) -> Type) a1) a2
type FoldMap (a1 :: a6989586621680742384 ~> k2) (a2 :: Product a6989586621680742384) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type FoldMap (a1 :: a6989586621680742384 ~> k2) (a2 :: Product a6989586621680742384) = Apply (Apply (FoldMap_6989586621680744076Sym0 :: TyFun (a6989586621680742384 ~> k2) (Product a6989586621680742384 ~> k2) -> Type) a1) a2
type (a1 :: k1) <$ (a2 :: Product b6989586621679962806) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type (a1 :: k1) <$ (a2 :: Product b6989586621679962806) = Apply (Apply (TFHelper_6989586621680215285Sym0 :: TyFun k1 (Product b6989586621679962806 ~> Product k1) -> Type) a1) a2
type Fmap (a1 :: a6989586621679962803 ~> b6989586621679962804) (a2 :: Product a6989586621679962803) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Fmap (a1 :: a6989586621679962803 ~> b6989586621679962804) (a2 :: Product a6989586621679962803) = Apply (Apply (Fmap_6989586621680215273Sym0 :: TyFun (a6989586621679962803 ~> b6989586621679962804) (Product a6989586621679962803 ~> Product b6989586621679962804) -> Type) a1) a2
type (arg1 :: Product a0) <* (arg2 :: Product b0) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type (arg1 :: Product a0) <* (arg2 :: Product b0) = Apply (Apply (TFHelper_6989586621679963287Sym0 :: TyFun (Product a0) (Product b0 ~> Product a0) -> Type) arg1) arg2
type (arg1 :: Product a0) *> (arg2 :: Product b0) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type (arg1 :: Product a0) *> (arg2 :: Product b0) = Apply (Apply (TFHelper_6989586621679963275Sym0 :: TyFun (Product a0) (Product b0 ~> Product b0) -> Type) arg1) arg2
type (a1 :: Product (a6989586621679962809 ~> b6989586621679962810)) <*> (a2 :: Product a6989586621679962809) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type (a1 :: Product (a6989586621679962809 ~> b6989586621679962810)) <*> (a2 :: Product a6989586621679962809) = Apply (Apply (TFHelper_6989586621680215261Sym0 :: TyFun (Product (a6989586621679962809 ~> b6989586621679962810)) (Product a6989586621679962809 ~> Product b6989586621679962810) -> Type) a1) a2
type (arg1 :: Product a0) >> (arg2 :: Product b0) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type (arg1 :: Product a0) >> (arg2 :: Product b0) = Apply (Apply (TFHelper_6989586621679963313Sym0 :: TyFun (Product a0) (Product b0 ~> Product b0) -> Type) arg1) arg2
type (a1 :: Product a6989586621679962832) >>= (a2 :: a6989586621679962832 ~> Product b6989586621679962833) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type (a1 :: Product a6989586621679962832) >>= (a2 :: a6989586621679962832 ~> Product b6989586621679962833) = Apply (Apply (TFHelper_6989586621680215304Sym0 :: TyFun (Product a6989586621679962832) ((a6989586621679962832 ~> Product b6989586621679962833) ~> Product b6989586621679962833) -> Type) a1) a2
type MapM (arg1 :: a0 ~> m0 b0) (arg2 :: Product a0) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type MapM (arg1 :: a0 ~> m0 b0) (arg2 :: Product a0) = Apply (Apply (MapM_6989586621680989011Sym0 :: TyFun (a0 ~> m0 b0) (Product a0 ~> m0 (Product b0)) -> Type) arg1) arg2
type Traverse (a1 :: a6989586621680988964 ~> f6989586621680988963 b6989586621680988965) (a2 :: Product a6989586621680988964) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type Traverse (a1 :: a6989586621680988964 ~> f6989586621680988963 b6989586621680988965) (a2 :: Product a6989586621680988964) = Apply (Apply (Traverse_6989586621680995161Sym0 :: TyFun (a6989586621680988964 ~> f6989586621680988963 b6989586621680988965) (Product a6989586621680988964 ~> f6989586621680988963 (Product b6989586621680988965)) -> Type) a1) a2
type Foldl' (a1 :: k2 ~> (a6989586621680742392 ~> k2)) (a2 :: k2) (a3 :: Product a6989586621680742392) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Foldl' (a1 :: k2 ~> (a6989586621680742392 ~> k2)) (a2 :: k2) (a3 :: Product a6989586621680742392) = Apply (Apply (Apply (Foldl'_6989586621680744118Sym0 :: TyFun (k2 ~> (a6989586621680742392 ~> k2)) (k2 ~> (Product a6989586621680742392 ~> k2)) -> Type) a1) a2) a3
type Foldl (a1 :: k2 ~> (a6989586621680742390 ~> k2)) (a2 :: k2) (a3 :: Product a6989586621680742390) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Foldl (a1 :: k2 ~> (a6989586621680742390 ~> k2)) (a2 :: k2) (a3 :: Product a6989586621680742390) = Apply (Apply (Apply (Foldl_6989586621680744101Sym0 :: TyFun (k2 ~> (a6989586621680742390 ~> k2)) (k2 ~> (Product a6989586621680742390 ~> k2)) -> Type) a1) a2) a3
type Foldr' (a1 :: a6989586621680742387 ~> (k2 ~> k2)) (a2 :: k2) (a3 :: Product a6989586621680742387) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Foldr' (a1 :: a6989586621680742387 ~> (k2 ~> k2)) (a2 :: k2) (a3 :: Product a6989586621680742387) = Apply (Apply (Apply (Foldr'_6989586621680744163Sym0 :: TyFun (a6989586621680742387 ~> (k2 ~> k2)) (k2 ~> (Product a6989586621680742387 ~> k2)) -> Type) a1) a2) a3
type Foldr (a1 :: a6989586621680742385 ~> (k2 ~> k2)) (a2 :: k2) (a3 :: Product a6989586621680742385) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Foldr (a1 :: a6989586621680742385 ~> (k2 ~> k2)) (a2 :: k2) (a3 :: Product a6989586621680742385) = Apply (Apply (Apply (Foldr_6989586621680744146Sym0 :: TyFun (a6989586621680742385 ~> (k2 ~> k2)) (k2 ~> (Product a6989586621680742385 ~> k2)) -> Type) a1) a2) a3
type LiftA2 (arg1 :: a0 ~> (b0 ~> c0)) (arg2 :: Product a0) (arg3 :: Product b0) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type LiftA2 (arg1 :: a0 ~> (b0 ~> c0)) (arg2 :: Product a0) (arg3 :: Product b0) = Apply (Apply (Apply (LiftA2_6989586621679963257Sym0 :: TyFun (a0 ~> (b0 ~> c0)) (Product a0 ~> (Product b0 ~> Product c0)) -> Type) arg1) arg2) arg3
newtype MVector s (Product a) 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype MVector s (Product a) = MV_Product (MVector s a)
type Apply (FromInteger_6989586621680215384Sym0 :: TyFun Nat (Product a6989586621680214913) -> Type) (a6989586621680215383 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (FromInteger_6989586621680215384Sym0 :: TyFun Nat (Product a6989586621680214913) -> Type) (a6989586621680215383 :: Nat) = FromInteger_6989586621680215384 a6989586621680215383 :: Product a6989586621680214913
type Apply (ProductSym0 :: TyFun a (Product a) -> Type) (t6989586621680197098 :: a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (ProductSym0 :: TyFun a (Product a) -> Type) (t6989586621680197098 :: a) = 'Product t6989586621680197098
type Apply (Pure_6989586621680215251Sym0 :: TyFun a (Product a) -> Type) (a6989586621680215250 :: a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (Pure_6989586621680215251Sym0 :: TyFun a (Product a) -> Type) (a6989586621680215250 :: a) = Pure_6989586621680215251 a6989586621680215250
type Apply (Product_Sym0 :: TyFun a (Product a) -> Type) (a6989586621680229709 :: a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (Product_Sym0 :: TyFun a (Product a) -> Type) (a6989586621680229709 :: a) = Product_ a6989586621680229709
type Apply (ShowsPrec_6989586621681091339Sym0 :: TyFun Nat (Product a6989586621679087468 ~> (Symbol ~> Symbol)) -> Type) (a6989586621681091336 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ShowsPrec_6989586621681091339Sym0 :: TyFun Nat (Product a6989586621679087468 ~> (Symbol ~> Symbol)) -> Type) (a6989586621681091336 :: Nat) = ShowsPrec_6989586621681091339Sym1 a6989586621681091336 a6989586621679087468 :: TyFun (Product a6989586621679087468) (Symbol ~> Symbol) -> Type
type Apply (TFHelper_6989586621680215285Sym0 :: TyFun a6989586621679962805 (Product b6989586621679962806 ~> Product a6989586621679962805) -> Type) (a6989586621680215283 :: a6989586621679962805) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (TFHelper_6989586621680215285Sym0 :: TyFun a6989586621679962805 (Product b6989586621679962806 ~> Product a6989586621679962805) -> Type) (a6989586621680215283 :: a6989586621679962805) = TFHelper_6989586621680215285Sym1 a6989586621680215283 b6989586621679962806 :: TyFun (Product b6989586621679962806) (Product a6989586621679962805) -> Type
type Rep (Product a) 
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)))
newtype Vector (Product a) 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype Vector (Product a) = V_Product (Vector a)
type Unwrapped (Product a) 
Instance details

Defined in Control.Lens.Wrapped

type Unwrapped (Product a) = a
type Sing 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Sing = SProduct :: Product a -> Type
type Element (Product a) 
Instance details

Defined in Universum.Container.Class

type Element (Product a) = ElementDefault (Product a)
type Mempty 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Mempty = Mempty_6989586621680640860Sym0 :: Product a
type MaxBound 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type MaxBound = MaxBound_6989586621680201884Sym0 :: Product a
type MinBound 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type MinBound = MinBound_6989586621680201882Sym0 :: Product a
type Demote (Product a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Demote (Product a) = Product (Demote a)
type Rep1 Product 
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 (arg0 :: [Product a]) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Mconcat (arg0 :: [Product a]) = Apply (Mconcat_6989586621680631303Sym0 :: TyFun [Product a] (Product a) -> Type) arg0
type Show_ (arg0 :: Product a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Show_ (arg0 :: Product a) = Apply (Show__6989586621680577846Sym0 :: TyFun (Product a) Symbol -> Type) arg0
type Sconcat (arg0 :: NonEmpty (Product a)) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Sconcat (arg0 :: NonEmpty (Product a)) = Apply (Sconcat_6989586621680187691Sym0 :: TyFun (NonEmpty (Product a)) (Product a) -> Type) arg0
type FromInteger a2 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type FromInteger a2 = Apply (FromInteger_6989586621680215384Sym0 :: 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_6989586621680215377Sym0 :: 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_6989586621680215370Sym0 :: 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_6989586621680215363Sym0 :: 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_6989586621680631288Sym0 :: 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_6989586621680577854Sym0 :: 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_6989586621680215316Sym0 :: 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_6989586621680215352Sym0 :: 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_6989586621680215340Sym0 :: 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_6989586621680215328Sym0 :: 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_6989586621679792614Sym0 :: 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_6989586621679792596Sym0 :: 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_6989586621679792578Sym0 :: 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_6989586621679792560Sym0 :: 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_6989586621679792542Sym0 :: 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_6989586621679792524Sym0 :: 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_6989586621680206682Sym0 :: 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_6989586621680203558 a2 b
type HKD Product (a :: Type) 
Instance details

Defined in Data.Vinyl.XRec

type HKD Product (a :: Type) = a
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_6989586621681091339Sym0 :: TyFun Nat (Product a1 ~> (Symbol ~> Symbol)) -> Type) a2) a3) a4
type Apply (GetProductSym0 :: TyFun (Product a) a -> Type) (a6989586621680197095 :: Product a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (GetProductSym0 :: TyFun (Product a) a -> Type) (a6989586621680197095 :: Product a) = GetProduct a6989586621680197095
type Apply (Compare_6989586621680206682Sym1 a6989586621680206680 :: TyFun (Product a) Ordering -> Type) (a6989586621680206681 :: Product a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (Compare_6989586621680206682Sym1 a6989586621680206680 :: TyFun (Product a) Ordering -> Type) (a6989586621680206681 :: Product a) = Compare_6989586621680206682 a6989586621680206680 a6989586621680206681
type Apply (Negate_6989586621680215363Sym0 :: TyFun (Product a) (Product a) -> Type) (a6989586621680215362 :: Product a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (Negate_6989586621680215363Sym0 :: TyFun (Product a) (Product a) -> Type) (a6989586621680215362 :: Product a) = Negate_6989586621680215363 a6989586621680215362
type Apply (Abs_6989586621680215370Sym0 :: TyFun (Product a) (Product a) -> Type) (a6989586621680215369 :: Product a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (Abs_6989586621680215370Sym0 :: TyFun (Product a) (Product a) -> Type) (a6989586621680215369 :: Product a) = Abs_6989586621680215370 a6989586621680215369
type Apply (Signum_6989586621680215377Sym0 :: TyFun (Product a) (Product a) -> Type) (a6989586621680215376 :: Product a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (Signum_6989586621680215377Sym0 :: TyFun (Product a) (Product a) -> Type) (a6989586621680215376 :: Product a) = Signum_6989586621680215377 a6989586621680215376
type Apply (Let6989586621680743352Scrutinee_6989586621680742625Sym0 :: TyFun (t6989586621680742381 a6989586621680742384) (Product a6989586621680742384) -> Type) (x6989586621680743351 :: t6989586621680742381 a6989586621680742384) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Apply (Let6989586621680743352Scrutinee_6989586621680742625Sym0 :: TyFun (t6989586621680742381 a6989586621680742384) (Product a6989586621680742384) -> Type) (x6989586621680743351 :: t6989586621680742381 a6989586621680742384) = Let6989586621680743352Scrutinee_6989586621680742625 x6989586621680743351
type Apply (TFHelper_6989586621680215316Sym1 a6989586621680215314 :: TyFun (Product a) (Product a) -> Type) (a6989586621680215315 :: Product a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (TFHelper_6989586621680215316Sym1 a6989586621680215314 :: TyFun (Product a) (Product a) -> Type) (a6989586621680215315 :: Product a) = TFHelper_6989586621680215316 a6989586621680215314 a6989586621680215315
type Apply (TFHelper_6989586621680215328Sym1 a6989586621680215326 :: TyFun (Product a) (Product a) -> Type) (a6989586621680215327 :: Product a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (TFHelper_6989586621680215328Sym1 a6989586621680215326 :: TyFun (Product a) (Product a) -> Type) (a6989586621680215327 :: Product a) = TFHelper_6989586621680215328 a6989586621680215326 a6989586621680215327
type Apply (TFHelper_6989586621680215340Sym1 a6989586621680215338 :: TyFun (Product a) (Product a) -> Type) (a6989586621680215339 :: Product a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (TFHelper_6989586621680215340Sym1 a6989586621680215338 :: TyFun (Product a) (Product a) -> Type) (a6989586621680215339 :: Product a) = TFHelper_6989586621680215340 a6989586621680215338 a6989586621680215339
type Apply (TFHelper_6989586621680215352Sym1 a6989586621680215350 :: TyFun (Product a) (Product a) -> Type) (a6989586621680215351 :: Product a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (TFHelper_6989586621680215352Sym1 a6989586621680215350 :: TyFun (Product a) (Product a) -> Type) (a6989586621680215351 :: Product a) = TFHelper_6989586621680215352 a6989586621680215350 a6989586621680215351
type Apply (TFHelper_6989586621680215261Sym1 a6989586621680215259 :: TyFun (Product a) (Product b) -> Type) (a6989586621680215260 :: Product a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (TFHelper_6989586621680215261Sym1 a6989586621680215259 :: TyFun (Product a) (Product b) -> Type) (a6989586621680215260 :: Product a) = TFHelper_6989586621680215261 a6989586621680215259 a6989586621680215260
type Apply (Fmap_6989586621680215273Sym1 a6989586621680215271 :: TyFun (Product a) (Product b) -> Type) (a6989586621680215272 :: Product a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (Fmap_6989586621680215273Sym1 a6989586621680215271 :: TyFun (Product a) (Product b) -> Type) (a6989586621680215272 :: Product a) = Fmap_6989586621680215273 a6989586621680215271 a6989586621680215272
type Apply (TFHelper_6989586621680215285Sym1 a6989586621680215283 b :: TyFun (Product b) (Product a) -> Type) (a6989586621680215284 :: Product b) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (TFHelper_6989586621680215285Sym1 a6989586621680215283 b :: TyFun (Product b) (Product a) -> Type) (a6989586621680215284 :: Product b) = TFHelper_6989586621680215285 a6989586621680215283 a6989586621680215284
type Apply (Traverse_6989586621680995161Sym1 a6989586621680995159 :: TyFun (Product a) (f (Product b)) -> Type) (a6989586621680995160 :: Product a) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type Apply (Traverse_6989586621680995161Sym1 a6989586621680995159 :: TyFun (Product a) (f (Product b)) -> Type) (a6989586621680995160 :: Product a) = Traverse_6989586621680995161 a6989586621680995159 a6989586621680995160
type Apply (Compare_6989586621680206682Sym0 :: TyFun (Product a6989586621679087468) (Product a6989586621679087468 ~> Ordering) -> Type) (a6989586621680206680 :: Product a6989586621679087468) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (Compare_6989586621680206682Sym0 :: TyFun (Product a6989586621679087468) (Product a6989586621679087468 ~> Ordering) -> Type) (a6989586621680206680 :: Product a6989586621679087468) = Compare_6989586621680206682Sym1 a6989586621680206680
type Apply (TFHelper_6989586621680215316Sym0 :: TyFun (Product a6989586621680214910) (Product a6989586621680214910 ~> Product a6989586621680214910) -> Type) (a6989586621680215314 :: Product a6989586621680214910) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (TFHelper_6989586621680215316Sym0 :: TyFun (Product a6989586621680214910) (Product a6989586621680214910 ~> Product a6989586621680214910) -> Type) (a6989586621680215314 :: Product a6989586621680214910) = TFHelper_6989586621680215316Sym1 a6989586621680215314
type Apply (TFHelper_6989586621680215328Sym0 :: TyFun (Product a6989586621680214913) (Product a6989586621680214913 ~> Product a6989586621680214913) -> Type) (a6989586621680215326 :: Product a6989586621680214913) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (TFHelper_6989586621680215328Sym0 :: TyFun (Product a6989586621680214913) (Product a6989586621680214913 ~> Product a6989586621680214913) -> Type) (a6989586621680215326 :: Product a6989586621680214913) = TFHelper_6989586621680215328Sym1 a6989586621680215326
type Apply (TFHelper_6989586621680215340Sym0 :: TyFun (Product a6989586621680214913) (Product a6989586621680214913 ~> Product a6989586621680214913) -> Type) (a6989586621680215338 :: Product a6989586621680214913) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (TFHelper_6989586621680215340Sym0 :: TyFun (Product a6989586621680214913) (Product a6989586621680214913 ~> Product a6989586621680214913) -> Type) (a6989586621680215338 :: Product a6989586621680214913) = TFHelper_6989586621680215340Sym1 a6989586621680215338
type Apply (TFHelper_6989586621680215352Sym0 :: TyFun (Product a6989586621680214913) (Product a6989586621680214913 ~> Product a6989586621680214913) -> Type) (a6989586621680215350 :: Product a6989586621680214913) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (TFHelper_6989586621680215352Sym0 :: TyFun (Product a6989586621680214913) (Product a6989586621680214913 ~> Product a6989586621680214913) -> Type) (a6989586621680215350 :: Product a6989586621680214913) = TFHelper_6989586621680215352Sym1 a6989586621680215350
type Apply (TFHelper_6989586621680215304Sym0 :: TyFun (Product a6989586621679962832) ((a6989586621679962832 ~> Product b6989586621679962833) ~> Product b6989586621679962833) -> Type) (a6989586621680215302 :: Product a6989586621679962832) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (TFHelper_6989586621680215304Sym0 :: TyFun (Product a6989586621679962832) ((a6989586621679962832 ~> Product b6989586621679962833) ~> Product b6989586621679962833) -> Type) (a6989586621680215302 :: Product a6989586621679962832) = TFHelper_6989586621680215304Sym1 a6989586621680215302 b6989586621679962833 :: TyFun (a6989586621679962832 ~> Product b6989586621679962833) (Product b6989586621679962833) -> Type
type Apply (ShowsPrec_6989586621681091339Sym1 a6989586621681091336 a6989586621679087468 :: TyFun (Product a6989586621679087468) (Symbol ~> Symbol) -> Type) (a6989586621681091337 :: Product a6989586621679087468) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup

type Apply (ShowsPrec_6989586621681091339Sym1 a6989586621681091336 a6989586621679087468 :: TyFun (Product a6989586621679087468) (Symbol ~> Symbol) -> Type) (a6989586621681091337 :: Product a6989586621679087468) = ShowsPrec_6989586621681091339Sym2 a6989586621681091336 a6989586621681091337
type Apply (TFHelper_6989586621680215261Sym0 :: TyFun (Product (a6989586621679962809 ~> b6989586621679962810)) (Product a6989586621679962809 ~> Product b6989586621679962810) -> Type) (a6989586621680215259 :: Product (a6989586621679962809 ~> b6989586621679962810)) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (TFHelper_6989586621680215261Sym0 :: TyFun (Product (a6989586621679962809 ~> b6989586621679962810)) (Product a6989586621679962809 ~> Product b6989586621679962810) -> Type) (a6989586621680215259 :: Product (a6989586621679962809 ~> b6989586621679962810)) = TFHelper_6989586621680215261Sym1 a6989586621680215259
type Apply (TFHelper_6989586621680215304Sym1 a6989586621680215302 b :: TyFun (a ~> Product b) (Product b) -> Type) (a6989586621680215303 :: a ~> Product b) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (TFHelper_6989586621680215304Sym1 a6989586621680215302 b :: TyFun (a ~> Product b) (Product b) -> Type) (a6989586621680215303 :: a ~> Product b) = TFHelper_6989586621680215304 a6989586621680215302 a6989586621680215303
type Apply (Fmap_6989586621680215273Sym0 :: TyFun (a6989586621679962803 ~> b6989586621679962804) (Product a6989586621679962803 ~> Product b6989586621679962804) -> Type) (a6989586621680215271 :: a6989586621679962803 ~> b6989586621679962804) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (Fmap_6989586621680215273Sym0 :: TyFun (a6989586621679962803 ~> b6989586621679962804) (Product a6989586621679962803 ~> Product b6989586621679962804) -> Type) (a6989586621680215271 :: a6989586621679962803 ~> b6989586621679962804) = Fmap_6989586621680215273Sym1 a6989586621680215271
type Apply (Traverse_6989586621680995161Sym0 :: TyFun (a6989586621680988964 ~> f6989586621680988963 b6989586621680988965) (Product a6989586621680988964 ~> f6989586621680988963 (Product b6989586621680988965)) -> Type) (a6989586621680995159 :: a6989586621680988964 ~> f6989586621680988963 b6989586621680988965) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type Apply (Traverse_6989586621680995161Sym0 :: TyFun (a6989586621680988964 ~> f6989586621680988963 b6989586621680988965) (Product a6989586621680988964 ~> f6989586621680988963 (Product b6989586621680988965)) -> Type) (a6989586621680995159 :: a6989586621680988964 ~> f6989586621680988963 b6989586621680988965) = Traverse_6989586621680995161Sym1 a6989586621680995159

newtype Alt (f :: k -> Type) (a :: k) #

Monoid under <|>.

Since: base-4.8.0.0

Constructors

Alt 

Fields

Instances

Instances details
Generic1 (Alt f :: k -> Type)

Since: base-4.8.0.0

Instance details

Defined in Data.Semigroup.Internal

Associated Types

type Rep1 (Alt f) :: k -> Type #

Methods

from1 :: forall (a :: k0). Alt f a -> Rep1 (Alt f) a #

to1 :: forall (a :: k0). Rep1 (Alt f) a -> Alt f a #

Unbox (f a) => Vector Vector (Alt f a) 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicUnsafeFreeze :: PrimMonad m => Mutable Vector (PrimState m) (Alt f a) -> m (Vector (Alt f a)) #

basicUnsafeThaw :: PrimMonad m => Vector (Alt f a) -> m (Mutable Vector (PrimState m) (Alt f a)) #

basicLength :: Vector (Alt f a) -> Int #

basicUnsafeSlice :: Int -> Int -> Vector (Alt f a) -> Vector (Alt f a) #

basicUnsafeIndexM :: Monad m => Vector (Alt f a) -> Int -> m (Alt f a) #

basicUnsafeCopy :: PrimMonad m => Mutable Vector (PrimState m) (Alt f a) -> Vector (Alt f a) -> m () #

elemseq :: Vector (Alt f a) -> Alt f a -> b -> b #

Unbox (f a) => MVector MVector (Alt f a) 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicLength :: MVector s (Alt f a) -> Int #

basicUnsafeSlice :: Int -> Int -> MVector s (Alt f a) -> MVector s (Alt f a) #

basicOverlaps :: MVector s (Alt f a) -> MVector s (Alt f a) -> Bool #

basicUnsafeNew :: PrimMonad m => Int -> m (MVector (PrimState m) (Alt f a)) #

basicInitialize :: PrimMonad m => MVector (PrimState m) (Alt f a) -> m () #

basicUnsafeReplicate :: PrimMonad m => Int -> Alt f a -> m (MVector (PrimState m) (Alt f a)) #

basicUnsafeRead :: PrimMonad m => MVector (PrimState m) (Alt f a) -> Int -> m (Alt f a) #

basicUnsafeWrite :: PrimMonad m => MVector (PrimState m) (Alt f a) -> Int -> Alt f a -> m () #

basicClear :: PrimMonad m => MVector (PrimState m) (Alt f a) -> m () #

basicSet :: PrimMonad m => MVector (PrimState m) (Alt f a) -> Alt f a -> m () #

basicUnsafeCopy :: PrimMonad m => MVector (PrimState m) (Alt f a) -> MVector (PrimState m) (Alt f a) -> m () #

basicUnsafeMove :: PrimMonad m => MVector (PrimState m) (Alt f a) -> MVector (PrimState m) (Alt f a) -> m () #

basicUnsafeGrow :: PrimMonad m => MVector (PrimState m) (Alt f a) -> Int -> m (MVector (PrimState m) (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 #

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 #

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 #

(Data (f a), Data a, Typeable f) => Data (Alt f a)

Since: base-4.8.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Alt f a -> c (Alt f a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Alt f a) #

toConstr :: Alt f a -> Constr #

dataTypeOf :: Alt f a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Alt f a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Alt f a)) #

gmapT :: (forall b. Data b => b -> b) -> Alt f a -> Alt f a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Alt f a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Alt f a -> r #

gmapQ :: (forall d. Data d => d -> u) -> Alt f a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Alt f a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Alt f a -> m (Alt f a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Alt f a -> m (Alt f a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Alt f a -> m (Alt f a) #

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)

Since: base-4.8.0.0

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 #

Unbox (f a) => Unbox (Alt f a) 
Instance details

Defined in Data.Vector.Unboxed.Base

Wrapped (Alt f a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (Alt f a) #

Methods

_Wrapped' :: Iso' (Alt f a) (Unwrapped (Alt f a)) #

t ~ Alt g b => Rewrapped (Alt f a) t 
Instance details

Defined in Control.Lens.Wrapped

type Rep1 (Alt f :: k -> Type) 
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)))
newtype MVector s (Alt f a) 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype MVector s (Alt f a) = MV_Alt (MVector s (f a))
type Rep (Alt f a) 
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))))
newtype Vector (Alt f a) 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype Vector (Alt f a) = V_Alt (Vector (f a))
type Unwrapped (Alt f a) 
Instance details

Defined in Control.Lens.Wrapped

type Unwrapped (Alt f a) = f a

someNatVal :: Natural -> SomeNat #

Convert an integer into an unknown type-level natural.

Since: base-4.10.0.0

natVal :: forall (n :: Nat) proxy. KnownNat n => proxy n -> Natural #

Since: base-4.10.0.0

data SomeNat #

This type represents unknown type-level natural numbers.

Since: base-4.10.0.0

Constructors

KnownNat n => SomeNat (Proxy n) 

Instances

Instances details
Eq SomeNat

Since: base-4.7.0.0

Instance details

Defined in GHC.TypeNats

Methods

(==) :: SomeNat -> SomeNat -> Bool #

(/=) :: SomeNat -> SomeNat -> Bool #

Ord SomeNat

Since: base-4.7.0.0

Instance details

Defined in GHC.TypeNats

Read SomeNat

Since: base-4.7.0.0

Instance details

Defined in GHC.TypeNats

Show SomeNat

Since: base-4.7.0.0

Instance details

Defined in GHC.TypeNats

unfoldr :: (b -> Maybe (a, b)) -> b -> [a] #

The unfoldr function is a `dual' to foldr: while foldr reduces a list to a summary value, unfoldr builds a list from a seed value. The function takes the element and returns Nothing if it is done producing the list or returns Just (a,b), in which case, a is a prepended to the list and b is used as the next element in a recursive call. For example,

iterate f == unfoldr (\x -> Just (x, f x))

In some cases, unfoldr can undo a foldr operation:

unfoldr f' (foldr f z xs) == xs

if the following holds:

f' (f x y) = Just (x,y)
f' z       = Nothing

A simple use of unfoldr:

>>> unfoldr (\b -> if b == 0 then Nothing else Just (b, b-1)) 10
[10,9,8,7,6,5,4,3,2,1]

sortOn :: Ord b => (a -> b) -> [a] -> [a] #

Sort a list by comparing the results of a key function applied to each element. sortOn f is equivalent to sortBy (comparing f), but has the performance advantage of only evaluating f once for each element in the input list. This is called the decorate-sort-undecorate paradigm, or Schwartzian transform.

Elements are arranged from from lowest to highest, keeping duplicates in the order they appeared in the input.

>>> sortOn fst [(2, "world"), (4, "!"), (1, "Hello")]
[(1,"Hello"),(2,"world"),(4,"!")]

Since: base-4.8.0.0

sortBy :: (a -> a -> Ordering) -> [a] -> [a] #

The sortBy function is the non-overloaded version of sort.

>>> sortBy (\(a,_) (b,_) -> compare a b) [(2, "world"), (4, "!"), (1, "Hello")]
[(1,"Hello"),(2,"world"),(4,"!")]

sort :: Ord a => [a] -> [a] #

The sort function implements a stable sorting algorithm. It is a special case of sortBy, which allows the programmer to supply their own comparison function.

Elements are arranged from from lowest to highest, keeping duplicates in the order they appeared in the input.

>>> sort [1,6,4,3,2,5]
[1,2,3,4,5,6]

permutations :: [a] -> [[a]] #

The permutations function returns the list of all permutations of the argument.

>>> permutations "abc"
["abc","bac","cba","bca","cab","acb"]

subsequences :: [a] -> [[a]] #

The subsequences function returns the list of all subsequences of the argument.

>>> subsequences "abc"
["","a","b","ab","c","ac","bc","abc"]

tails :: [a] -> [[a]] #

O(n). The tails function returns all final segments of the argument, longest first. For example,

>>> tails "abc"
["abc","bc","c",""]

Note that tails has the following strictness property: tails _|_ = _|_ : _|_

inits :: [a] -> [[a]] #

The inits function returns all initial segments of the argument, shortest first. For example,

>>> inits "abc"
["","a","ab","abc"]

Note that inits has the following strictness property: inits (xs ++ _|_) = inits xs ++ _|_

In particular, inits _|_ = [] : _|_

group :: Eq a => [a] -> [[a]] #

The group function takes a list and returns a list of lists such that the concatenation of the result is equal to the argument. Moreover, each sublist in the result contains only equal elements. For example,

>>> group "Mississippi"
["M","i","ss","i","ss","i","pp","i"]

It is a special case of groupBy, which allows the programmer to supply their own equality test.

genericReplicate :: Integral i => i -> a -> [a] #

The genericReplicate function is an overloaded version of replicate, which accepts any Integral value as the number of repetitions to make.

genericSplitAt :: Integral i => i -> [a] -> ([a], [a]) #

The genericSplitAt function is an overloaded version of splitAt, which accepts any Integral value as the position at which to split.

genericDrop :: Integral i => i -> [a] -> [a] #

The genericDrop function is an overloaded version of drop, which accepts any Integral value as the number of elements to drop.

genericTake :: Integral i => i -> [a] -> [a] #

The genericTake function is an overloaded version of take, which accepts any Integral value as the number of elements to take.

genericLength :: Num i => [a] -> i #

O(n). The genericLength function is an overloaded version of length. In particular, instead of returning an Int, it returns any type which is an instance of Num. It is, however, less efficient than length.

>>> genericLength [1, 2, 3] :: Int
3
>>> genericLength [1, 2, 3] :: Float
3.0

transpose :: [[a]] -> [[a]] #

The transpose function transposes the rows and columns of its argument. For example,

>>> transpose [[1,2,3],[4,5,6]]
[[1,4],[2,5],[3,6]]

If some of the rows are shorter than the following rows, their elements are skipped:

>>> transpose [[10,11],[20],[],[30,31,32]]
[[10,20,30],[11,31],[32]]

intercalate :: [a] -> [[a]] -> [a] #

intercalate xs xss is equivalent to (concat (intersperse xs xss)). It inserts the list xs in between the lists in xss and concatenates the result.

>>> intercalate ", " ["Lorem", "ipsum", "dolor"]
"Lorem, ipsum, dolor"

intersperse :: a -> [a] -> [a] #

O(n). The intersperse function takes an element and a list and `intersperses' that element between the elements of the list. For example,

>>> intersperse ',' "abcde"
"a,b,c,d,e"

isPrefixOf :: Eq a => [a] -> [a] -> Bool #

O(min(m,n)). The isPrefixOf function takes two lists and returns True iff the first list is a prefix of the second.

>>> "Hello" `isPrefixOf` "Hello World!"
True
>>> "Hello" `isPrefixOf` "Wello Horld!"
False

readMaybe :: Read a => String -> Maybe a #

Parse a string using the Read instance. Succeeds if there is exactly one valid result.

>>> readMaybe "123" :: Maybe Int
Just 123
>>> readMaybe "hello" :: Maybe Int
Nothing

Since: base-4.6.0.0

reads :: Read a => ReadS a #

equivalent to readsPrec with a precedence of 0.

isRight :: Either a b -> Bool #

Return True if the given value is a Right-value, False otherwise.

Examples

Expand

Basic usage:

>>> isRight (Left "foo")
False
>>> isRight (Right 3)
True

Assuming a Left value signifies some sort of error, we can use isRight to write a very simple reporting function that only outputs "SUCCESS" when a computation has succeeded.

This example shows how isRight might be used to avoid pattern matching when one does not care about the value contained in the constructor:

>>> import Control.Monad ( when )
>>> let report e = when (isRight e) $ putStrLn "SUCCESS"
>>> report (Left "parse error")
>>> report (Right 1)
SUCCESS

Since: base-4.7.0.0

isLeft :: Either a b -> Bool #

Return True if the given value is a Left-value, False otherwise.

Examples

Expand

Basic usage:

>>> isLeft (Left "foo")
True
>>> isLeft (Right 3)
False

Assuming a Left value signifies some sort of error, we can use isLeft to write a very simple error-reporting function that does absolutely nothing in the case of success, and outputs "ERROR" if any error occurred.

This example shows how isLeft might be used to avoid pattern matching when one does not care about the value contained in the constructor:

>>> import Control.Monad ( when )
>>> let report e = when (isLeft e) $ putStrLn "ERROR"
>>> report (Right 1)
>>> report (Left "parse error")
ERROR

Since: base-4.7.0.0

partitionEithers :: [Either a b] -> ([a], [b]) #

Partitions a list of Either into two lists. All the Left elements are extracted, in order, to the first component of the output. Similarly the Right elements are extracted to the second component of the output.

Examples

Expand

Basic usage:

>>> let list = [ Left "foo", Right 3, Left "bar", Right 7, Left "baz" ]
>>> partitionEithers list
(["foo","bar","baz"],[3,7])

The pair returned by partitionEithers x should be the same pair as (lefts x, rights x):

>>> let list = [ Left "foo", Right 3, Left "bar", Right 7, Left "baz" ]
>>> partitionEithers list == (lefts list, rights list)
True

rights :: [Either a b] -> [b] #

Extracts from a list of Either all the Right elements. All the Right elements are extracted in order.

Examples

Expand

Basic usage:

>>> let list = [ Left "foo", Right 3, Left "bar", Right 7, Left "baz" ]
>>> rights list
[3,7]

lefts :: [Either a b] -> [a] #

Extracts from a list of Either all the Left elements. All the Left elements are extracted in order.

Examples

Expand

Basic usage:

>>> let list = [ Left "foo", Right 3, Left "bar", Right 7, Left "baz" ]
>>> lefts list
["foo","bar","baz"]

comparing :: Ord a => (b -> a) -> b -> b -> Ordering #

comparing p x y = compare (p x) (p y)

Useful combinator for use in conjunction with the xxxBy family of functions from Data.List, for example:

  ... sortBy (comparing fst) ...

newtype Down a #

The Down type allows you to reverse sort order conveniently. A value of type Down a contains a value of type a (represented as Down a). If a has an Ord instance associated with it then comparing two values thus wrapped will give you the opposite of their normal sort order. This is particularly useful when sorting in generalised list comprehensions, as in: then sortWith by Down x

Since: base-4.6.0.0

Constructors

Down a 

Instances

Instances details
Monad Down

Since: base-4.11.0.0

Instance details

Defined in Data.Ord

Methods

(>>=) :: Down a -> (a -> Down b) -> Down b #

(>>) :: Down a -> Down b -> Down b #

return :: a -> Down a #

Functor Down

Since: base-4.11.0.0

Instance details

Defined in Data.Ord

Methods

fmap :: (a -> b) -> Down a -> Down b #

(<$) :: a -> Down b -> Down a #

Applicative Down

Since: base-4.11.0.0

Instance details

Defined in Data.Ord

Methods

pure :: a -> Down a #

(<*>) :: Down (a -> b) -> Down a -> Down b #

liftA2 :: (a -> b -> c) -> Down a -> Down b -> Down c #

(*>) :: Down a -> Down b -> Down b #

(<*) :: Down a -> Down b -> Down a #

Foldable Down

Since: base-4.12.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => Down m -> m #

foldMap :: Monoid m => (a -> m) -> Down a -> m #

foldMap' :: Monoid m => (a -> m) -> Down a -> m #

foldr :: (a -> b -> b) -> b -> Down a -> b #

foldr' :: (a -> b -> b) -> b -> Down a -> b #

foldl :: (b -> a -> b) -> b -> Down a -> b #

foldl' :: (b -> a -> b) -> b -> Down a -> b #

foldr1 :: (a -> a -> a) -> Down a -> a #

foldl1 :: (a -> a -> a) -> Down a -> a #

toList :: Down a -> [a] #

null :: Down a -> Bool #

length :: Down a -> Int #

elem :: Eq a => a -> Down a -> Bool #

maximum :: Ord a => Down a -> a #

minimum :: Ord a => Down a -> a #

sum :: Num a => Down a -> a #

product :: Num a => Down a -> a #

Traversable Down

Since: base-4.12.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> Down a -> f (Down b) #

sequenceA :: Applicative f => Down (f a) -> f (Down a) #

mapM :: Monad m => (a -> m b) -> Down a -> m (Down b) #

sequence :: Monad m => Down (m a) -> m (Down a) #

NFData1 Down

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

liftRnf :: (a -> ()) -> Down a -> () #

Unbox a => Vector Vector (Down a) 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicUnsafeFreeze :: PrimMonad m => Mutable Vector (PrimState m) (Down a) -> m (Vector (Down a)) #

basicUnsafeThaw :: PrimMonad m => Vector (Down a) -> m (Mutable Vector (PrimState m) (Down a)) #

basicLength :: Vector (Down a) -> Int #

basicUnsafeSlice :: Int -> Int -> Vector (Down a) -> Vector (Down a) #

basicUnsafeIndexM :: Monad m => Vector (Down a) -> Int -> m (Down a) #

basicUnsafeCopy :: PrimMonad m => Mutable Vector (PrimState m) (Down a) -> Vector (Down a) -> m () #

elemseq :: Vector (Down a) -> Down a -> b -> b #

Unbox a => MVector MVector (Down a) 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicLength :: MVector s (Down a) -> Int #

basicUnsafeSlice :: Int -> Int -> MVector s (Down a) -> MVector s (Down a) #

basicOverlaps :: MVector s (Down a) -> MVector s (Down a) -> Bool #

basicUnsafeNew :: PrimMonad m => Int -> m (MVector (PrimState m) (Down a)) #

basicInitialize :: PrimMonad m => MVector (PrimState m) (Down a) -> m () #

basicUnsafeReplicate :: PrimMonad m => Int -> Down a -> m (MVector (PrimState m) (Down a)) #

basicUnsafeRead :: PrimMonad m => MVector (PrimState m) (Down a) -> Int -> m (Down a) #

basicUnsafeWrite :: PrimMonad m => MVector (PrimState m) (Down a) -> Int -> Down a -> m () #

basicClear :: PrimMonad m => MVector (PrimState m) (Down a) -> m () #

basicSet :: PrimMonad m => MVector (PrimState m) (Down a) -> Down a -> m () #

basicUnsafeCopy :: PrimMonad m => MVector (PrimState m) (Down a) -> MVector (PrimState m) (Down a) -> m () #

basicUnsafeMove :: PrimMonad m => MVector (PrimState m) (Down a) -> MVector (PrimState m) (Down a) -> m () #

basicUnsafeGrow :: PrimMonad m => MVector (PrimState m) (Down a) -> Int -> m (MVector (PrimState m) (Down a)) #

Eq a => Eq (Down a)

Since: base-4.6.0.0

Instance details

Defined in Data.Ord

Methods

(==) :: Down a -> Down a -> Bool #

(/=) :: Down a -> Down a -> Bool #

Data a => Data (Down a)

Since: base-4.12.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Down a -> c (Down a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Down a) #

toConstr :: Down a -> Constr #

dataTypeOf :: Down a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Down a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Down a)) #

gmapT :: (forall b. Data b => b -> b) -> Down a -> Down a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Down a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Down a -> r #

gmapQ :: (forall d. Data d => d -> u) -> Down a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Down a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Down a -> m (Down a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Down a -> m (Down a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Down a -> m (Down a) #

Num a => Num (Down a)

Since: base-4.11.0.0

Instance details

Defined in Data.Ord

Methods

(+) :: Down a -> Down a -> Down a #

(-) :: Down a -> Down a -> Down a #

(*) :: Down a -> Down a -> Down a #

negate :: Down a -> Down a #

abs :: Down a -> Down a #

signum :: Down a -> Down a #

fromInteger :: Integer -> Down a #

Ord a => Ord (Down a)

Since: base-4.6.0.0

Instance details

Defined in Data.Ord

Methods

compare :: Down a -> Down a -> Ordering #

(<) :: Down a -> Down a -> Bool #

(<=) :: Down a -> Down a -> Bool #

(>) :: Down a -> Down a -> Bool #

(>=) :: Down a -> Down a -> Bool #

max :: Down a -> Down a -> Down a #

min :: Down a -> Down a -> Down a #

Read a => Read (Down a)

Since: base-4.7.0.0

Instance details

Defined in Data.Ord

Show a => Show (Down a)

Since: base-4.7.0.0

Instance details

Defined in Data.Ord

Methods

showsPrec :: Int -> Down a -> ShowS #

show :: Down a -> String #

showList :: [Down a] -> ShowS #

Generic (Down a)

Since: base-4.12.0.0

Instance details

Defined in GHC.Generics

Associated Types

type Rep (Down a) :: Type -> Type #

Methods

from :: Down a -> Rep (Down a) x #

to :: Rep (Down a) x -> Down a #

Semigroup a => Semigroup (Down a)

Since: base-4.11.0.0

Instance details

Defined in Data.Ord

Methods

(<>) :: Down a -> Down a -> Down a #

sconcat :: NonEmpty (Down a) -> Down a #

stimes :: Integral b => b -> Down a -> Down 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 #

NFData a => NFData (Down a)

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Down a -> () #

Unbox a => Unbox (Down a) 
Instance details

Defined in Data.Vector.Unboxed.Base

Wrapped (Down a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (Down a) #

Methods

_Wrapped' :: Iso' (Down a) (Unwrapped (Down a)) #

PMonoid (Down a) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

Associated Types

type Mempty :: a0 #

type Mappend arg0 arg1 :: a0 #

type Mconcat arg0 :: a0 #

SMonoid a => SMonoid (Down a) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

Methods

sMempty :: Sing MemptySym0 #

sMappend :: forall (t1 :: Down a) (t2 :: Down a). Sing t1 -> Sing t2 -> Sing (Apply (Apply MappendSym0 t1) t2) #

sMconcat :: forall (t :: [Down a]). Sing t -> Sing (Apply MconcatSym0 t) #

PSemigroup (Down a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

Associated Types

type arg0 <> arg1 :: a0 #

type Sconcat arg0 :: a0 #

SSemigroup a => SSemigroup (Down a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

Methods

(%<>) :: forall (t1 :: Down a) (t2 :: Down a). Sing t1 -> Sing t2 -> Sing (Apply (Apply (<>@#@$) t1) t2) #

sSconcat :: forall (t :: NonEmpty (Down a)). Sing t -> Sing (Apply SconcatSym0 t) #

PNum (Down a) 
Instance details

Defined in Data.Singletons.Prelude.Num

Associated Types

type arg0 + arg1 :: a0 #

type arg0 - arg1 :: a0 #

type arg0 * arg1 :: a0 #

type Negate arg0 :: a0 #

type Abs arg0 :: a0 #

type Signum arg0 :: a0 #

type FromInteger arg0 :: a0 #

SNum a => SNum (Down a) 
Instance details

Defined in Data.Singletons.Prelude.Num

Methods

(%+) :: forall (t1 :: Down a) (t2 :: Down a). Sing t1 -> Sing t2 -> Sing (Apply (Apply (+@#@$) t1) t2) #

(%-) :: forall (t1 :: Down a) (t2 :: Down a). Sing t1 -> Sing t2 -> Sing (Apply (Apply (-@#@$) t1) t2) #

(%*) :: forall (t1 :: Down a) (t2 :: Down a). Sing t1 -> Sing t2 -> Sing (Apply (Apply (*@#@$) t1) t2) #

sNegate :: forall (t :: Down a). Sing t -> Sing (Apply NegateSym0 t) #

sAbs :: forall (t :: Down a). Sing t -> Sing (Apply AbsSym0 t) #

sSignum :: forall (t :: Down a). Sing t -> Sing (Apply SignumSym0 t) #

sFromInteger :: forall (t :: Nat). Sing t -> Sing (Apply FromIntegerSym0 t) #

POrd (Down a) 
Instance details

Defined in Data.Singletons.Prelude.Ord

Associated Types

type Compare arg0 arg1 :: Ordering #

type arg0 < arg1 :: Bool #

type arg0 <= arg1 :: Bool #

type arg0 > arg1 :: Bool #

type arg0 >= arg1 :: Bool #

type Max arg0 arg1 :: a0 #

type Min arg0 arg1 :: a0 #

SOrd a => SOrd (Down a) 
Instance details

Defined in Data.Singletons.Prelude.Ord

Methods

sCompare :: forall (t1 :: Down a) (t2 :: Down a). Sing t1 -> Sing t2 -> Sing (Apply (Apply CompareSym0 t1) t2) #

(%<) :: forall (t1 :: Down a) (t2 :: Down a). Sing t1 -> Sing t2 -> Sing (Apply (Apply (<@#@$) t1) t2) #

(%<=) :: forall (t1 :: Down a) (t2 :: Down a). Sing t1 -> Sing t2 -> Sing (Apply (Apply (<=@#@$) t1) t2) #

(%>) :: forall (t1 :: Down a) (t2 :: Down a). Sing t1 -> Sing t2 -> Sing (Apply (Apply (>@#@$) t1) t2) #

(%>=) :: forall (t1 :: Down a) (t2 :: Down a). Sing t1 -> Sing t2 -> Sing (Apply (Apply (>=@#@$) t1) t2) #

sMax :: forall (t1 :: Down a) (t2 :: Down a). Sing t1 -> Sing t2 -> Sing (Apply (Apply MaxSym0 t1) t2) #

sMin :: forall (t1 :: Down a) (t2 :: Down a). Sing t1 -> Sing t2 -> Sing (Apply (Apply MinSym0 t1) t2) #

Generic1 Down

Since: base-4.12.0.0

Instance details

Defined in GHC.Generics

Associated Types

type Rep1 Down :: k -> Type #

Methods

from1 :: forall (a :: k). Down a -> Rep1 Down a #

to1 :: forall (a :: k). Rep1 Down a -> Down a #

t ~ Down b => Rewrapped (Down a) t 
Instance details

Defined in Control.Lens.Wrapped

SDecide a => TestCoercion (SDown :: Down a -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

Methods

testCoercion :: forall (a0 :: k) (b :: k). SDown a0 -> SDown b -> Maybe (Coercion a0 b) #

SDecide a => TestEquality (SDown :: Down a -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

Methods

testEquality :: forall (a0 :: k) (b :: k). SDown a0 -> SDown b -> Maybe (a0 :~: b) #

SingI (DownSym0 :: TyFun a (Down a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

Methods

sing :: Sing DownSym0 #

SuppressUnusedWarnings (DownSym0 :: TyFun a6989586621679095422 (Down a6989586621679095422) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

SuppressUnusedWarnings (Pure_6989586621681393603Sym0 :: TyFun a6989586621679962808 (Down a6989586621679962808) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Applicative

SuppressUnusedWarnings (Compare_6989586621679801934Sym0 :: TyFun (Down a6989586621679801914) (Down a6989586621679801914 ~> Ordering) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

SuppressUnusedWarnings (TFHelper_6989586621680106830Sym0 :: TyFun a6989586621679962805 (Down b6989586621679962806 ~> Down a6989586621679962805) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Functor

SuppressUnusedWarnings (Compare_6989586621679801934Sym1 a6989586621679801932 :: TyFun (Down a6989586621679801914) Ordering -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

SuppressUnusedWarnings (TFHelper_6989586621681402201Sym0 :: TyFun (Down a6989586621679962832) ((a6989586621679962832 ~> Down b6989586621679962833) ~> Down b6989586621679962833) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad

SuppressUnusedWarnings (TFHelper_6989586621681393613Sym0 :: TyFun (Down (a6989586621679962809 ~> b6989586621679962810)) (Down a6989586621679962809 ~> Down b6989586621679962810) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Applicative

SuppressUnusedWarnings (Fmap_6989586621680106818Sym0 :: TyFun (a6989586621679962803 ~> b6989586621679962804) (Down a6989586621679962803 ~> Down b6989586621679962804) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Functor

SuppressUnusedWarnings (TFHelper_6989586621680106830Sym1 a6989586621680106828 b6989586621679962806 :: TyFun (Down b6989586621679962806) (Down a6989586621679962805) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Functor

SuppressUnusedWarnings (Fmap_6989586621680106818Sym1 a6989586621680106816 :: TyFun (Down a6989586621679962803) (Down b6989586621679962804) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Functor

SuppressUnusedWarnings (TFHelper_6989586621681393613Sym1 a6989586621681393611 :: TyFun (Down a6989586621679962809) (Down b6989586621679962810) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Applicative

SuppressUnusedWarnings (TFHelper_6989586621681402201Sym1 a6989586621681402199 b6989586621679962833 :: TyFun (a6989586621679962832 ~> Down b6989586621679962833) (Down b6989586621679962833) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad

type Pure (a :: k1) 
Instance details

Defined in Data.Singletons.Prelude.Applicative

type Pure (a :: k1) = Apply (Pure_6989586621681393603Sym0 :: TyFun k1 (Down k1) -> Type) a
type Return (arg0 :: a0) 
Instance details

Defined in Data.Singletons.Prelude.Monad

type Return (arg0 :: a0) = Apply (Return_6989586621679963334Sym0 :: TyFun a0 (Down a0) -> Type) arg0
type (a1 :: k1) <$ (a2 :: Down b6989586621679962806) 
Instance details

Defined in Data.Singletons.Prelude.Functor

type (a1 :: k1) <$ (a2 :: Down b6989586621679962806) = Apply (Apply (TFHelper_6989586621680106830Sym0 :: TyFun k1 (Down b6989586621679962806 ~> Down k1) -> Type) a1) a2
type Fmap (a1 :: a6989586621679962803 ~> b6989586621679962804) (a2 :: Down a6989586621679962803) 
Instance details

Defined in Data.Singletons.Prelude.Functor

type Fmap (a1 :: a6989586621679962803 ~> b6989586621679962804) (a2 :: Down a6989586621679962803) = Apply (Apply (Fmap_6989586621680106818Sym0 :: TyFun (a6989586621679962803 ~> b6989586621679962804) (Down a6989586621679962803 ~> Down b6989586621679962804) -> Type) a1) a2
type (arg1 :: Down a0) <* (arg2 :: Down b0) 
Instance details

Defined in Data.Singletons.Prelude.Applicative

type (arg1 :: Down a0) <* (arg2 :: Down b0) = Apply (Apply (TFHelper_6989586621679963287Sym0 :: TyFun (Down a0) (Down b0 ~> Down a0) -> Type) arg1) arg2
type (arg1 :: Down a0) *> (arg2 :: Down b0) 
Instance details

Defined in Data.Singletons.Prelude.Applicative

type (arg1 :: Down a0) *> (arg2 :: Down b0) = Apply (Apply (TFHelper_6989586621679963275Sym0 :: TyFun (Down a0) (Down b0 ~> Down b0) -> Type) arg1) arg2
type (a1 :: Down (a6989586621679962809 ~> b6989586621679962810)) <*> (a2 :: Down a6989586621679962809) 
Instance details

Defined in Data.Singletons.Prelude.Applicative

type (a1 :: Down (a6989586621679962809 ~> b6989586621679962810)) <*> (a2 :: Down a6989586621679962809) = Apply (Apply (TFHelper_6989586621681393613Sym0 :: TyFun (Down (a6989586621679962809 ~> b6989586621679962810)) (Down a6989586621679962809 ~> Down b6989586621679962810) -> Type) a1) a2
type (arg1 :: Down a0) >> (arg2 :: Down b0) 
Instance details

Defined in Data.Singletons.Prelude.Monad

type (arg1 :: Down a0) >> (arg2 :: Down b0) = Apply (Apply (TFHelper_6989586621679963313Sym0 :: TyFun (Down a0) (Down b0 ~> Down b0) -> Type) arg1) arg2
type (a1 :: Down a6989586621679962832) >>= (a2 :: a6989586621679962832 ~> Down b6989586621679962833) 
Instance details

Defined in Data.Singletons.Prelude.Monad

type (a1 :: Down a6989586621679962832) >>= (a2 :: a6989586621679962832 ~> Down b6989586621679962833) = Apply (Apply (TFHelper_6989586621681402201Sym0 :: TyFun (Down a6989586621679962832) ((a6989586621679962832 ~> Down b6989586621679962833) ~> Down b6989586621679962833) -> Type) a1) a2
type LiftA2 (arg1 :: a0 ~> (b0 ~> c0)) (arg2 :: Down a0) (arg3 :: Down b0) 
Instance details

Defined in Data.Singletons.Prelude.Applicative

type LiftA2 (arg1 :: a0 ~> (b0 ~> c0)) (arg2 :: Down a0) (arg3 :: Down b0) = Apply (Apply (Apply (LiftA2_6989586621679963257Sym0 :: TyFun (a0 ~> (b0 ~> c0)) (Down a0 ~> (Down b0 ~> Down c0)) -> Type) arg1) arg2) arg3
newtype MVector s (Down a) 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype MVector s (Down a) = MV_Down (MVector s a)
type Apply (DownSym0 :: TyFun a (Down a) -> Type) (t6989586621679801484 :: a) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Apply (DownSym0 :: TyFun a (Down a) -> Type) (t6989586621679801484 :: a) = 'Down t6989586621679801484
type Apply (Pure_6989586621681393603Sym0 :: TyFun a (Down a) -> Type) (a6989586621681393602 :: a) 
Instance details

Defined in Data.Singletons.Prelude.Applicative

type Apply (Pure_6989586621681393603Sym0 :: TyFun a (Down a) -> Type) (a6989586621681393602 :: a) = Pure_6989586621681393603 a6989586621681393602
type Apply (TFHelper_6989586621680106830Sym0 :: TyFun a6989586621679962805 (Down b6989586621679962806 ~> Down a6989586621679962805) -> Type) (a6989586621680106828 :: a6989586621679962805) 
Instance details

Defined in Data.Singletons.Prelude.Functor

type Apply (TFHelper_6989586621680106830Sym0 :: TyFun a6989586621679962805 (Down b6989586621679962806 ~> Down a6989586621679962805) -> Type) (a6989586621680106828 :: a6989586621679962805) = TFHelper_6989586621680106830Sym1 a6989586621680106828 b6989586621679962806 :: TyFun (Down b6989586621679962806) (Down a6989586621679962805) -> Type
type Rep (Down a) 
Instance details

Defined in GHC.Generics

type Rep (Down a) = D1 ('MetaData "Down" "Data.Ord" "base" 'True) (C1 ('MetaCons "Down" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a)))
newtype Vector (Down a) 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype Vector (Down a) = V_Down (Vector a)
type Unwrapped (Down a) 
Instance details

Defined in Control.Lens.Wrapped

type Unwrapped (Down a) = a
type Sing 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Sing = SDown :: Down a -> Type
type Mempty 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Mempty = Mempty_6989586621680640862Sym0 :: Down a
type Demote (Down a) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Demote (Down a) = Down (Demote a)
type Rep1 Down 
Instance details

Defined in GHC.Generics

type Mconcat (arg0 :: [Down a]) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Mconcat (arg0 :: [Down a]) = Apply (Mconcat_6989586621680631303Sym0 :: TyFun [Down a] (Down a) -> Type) arg0
type Sconcat (arg0 :: NonEmpty (Down a)) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Sconcat (arg0 :: NonEmpty (Down a)) = Apply (Sconcat_6989586621680187691Sym0 :: TyFun (NonEmpty (Down a)) (Down a) -> Type) arg0
type FromInteger a2 
Instance details

Defined in Data.Singletons.Prelude.Num

type FromInteger a2 = Apply (FromInteger_6989586621679927818Sym0 :: TyFun Nat (Down a1) -> Type) a2
type Signum (a2 :: Down a1) 
Instance details

Defined in Data.Singletons.Prelude.Num

type Signum (a2 :: Down a1) = Apply (Signum_6989586621679927811Sym0 :: TyFun (Down a1) (Down a1) -> Type) a2
type Abs (a2 :: Down a1) 
Instance details

Defined in Data.Singletons.Prelude.Num

type Abs (a2 :: Down a1) = Apply (Abs_6989586621679927804Sym0 :: TyFun (Down a1) (Down a1) -> Type) a2
type Negate (a2 :: Down a1) 
Instance details

Defined in Data.Singletons.Prelude.Num

type Negate (a2 :: Down a1) = Apply (Negate_6989586621679927797Sym0 :: TyFun (Down a1) (Down a1) -> Type) a2
type Mappend (arg1 :: Down a) (arg2 :: Down a) 
Instance details

Defined in Data.Singletons.Prelude.Monoid

type Mappend (arg1 :: Down a) (arg2 :: Down a) = Apply (Apply (Mappend_6989586621680631288Sym0 :: TyFun (Down a) (Down a ~> Down a) -> Type) arg1) arg2
type (a2 :: Down a1) <> (a3 :: Down a1) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type (a2 :: Down a1) <> (a3 :: Down a1) = Apply (Apply (TFHelper_6989586621680187961Sym0 :: TyFun (Down a1) (Down a1 ~> Down a1) -> Type) a2) a3
type (a2 :: Down a1) * (a3 :: Down a1) 
Instance details

Defined in Data.Singletons.Prelude.Num

type (a2 :: Down a1) * (a3 :: Down a1) = Apply (Apply (TFHelper_6989586621679927786Sym0 :: TyFun (Down a1) (Down a1 ~> Down a1) -> Type) a2) a3
type (a2 :: Down a1) - (a3 :: Down a1) 
Instance details

Defined in Data.Singletons.Prelude.Num

type (a2 :: Down a1) - (a3 :: Down a1) = Apply (Apply (TFHelper_6989586621679927774Sym0 :: TyFun (Down a1) (Down a1 ~> Down a1) -> Type) a2) a3
type (a2 :: Down a1) + (a3 :: Down a1) 
Instance details

Defined in Data.Singletons.Prelude.Num

type (a2 :: Down a1) + (a3 :: Down a1) = Apply (Apply (TFHelper_6989586621679927762Sym0 :: TyFun (Down a1) (Down a1 ~> Down a1) -> Type) a2) a3
type Min (arg1 :: Down a) (arg2 :: Down a) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Min (arg1 :: Down a) (arg2 :: Down a) = Apply (Apply (Min_6989586621679792614Sym0 :: TyFun (Down a) (Down a ~> Down a) -> Type) arg1) arg2
type Max (arg1 :: Down a) (arg2 :: Down a) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Max (arg1 :: Down a) (arg2 :: Down a) = Apply (Apply (Max_6989586621679792596Sym0 :: TyFun (Down a) (Down a ~> Down a) -> Type) arg1) arg2
type (arg1 :: Down a) >= (arg2 :: Down a) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type (arg1 :: Down a) >= (arg2 :: Down a) = Apply (Apply (TFHelper_6989586621679792578Sym0 :: TyFun (Down a) (Down a ~> Bool) -> Type) arg1) arg2
type (arg1 :: Down a) > (arg2 :: Down a) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type (arg1 :: Down a) > (arg2 :: Down a) = Apply (Apply (TFHelper_6989586621679792560Sym0 :: TyFun (Down a) (Down a ~> Bool) -> Type) arg1) arg2
type (arg1 :: Down a) <= (arg2 :: Down a) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type (arg1 :: Down a) <= (arg2 :: Down a) = Apply (Apply (TFHelper_6989586621679792542Sym0 :: TyFun (Down a) (Down a ~> Bool) -> Type) arg1) arg2
type (arg1 :: Down a) < (arg2 :: Down a) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type (arg1 :: Down a) < (arg2 :: Down a) = Apply (Apply (TFHelper_6989586621679792524Sym0 :: TyFun (Down a) (Down a ~> Bool) -> Type) arg1) arg2
type Compare (a2 :: Down a1) (a3 :: Down a1) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Compare (a2 :: Down a1) (a3 :: Down a1) = Apply (Apply (Compare_6989586621679801934Sym0 :: TyFun (Down a1) (Down a1 ~> Ordering) -> Type) a2) a3
type (x :: Down a) /= (y :: Down a) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type (x :: Down a) /= (y :: Down a) = Not (x == y)
type (a2 :: Down a1) == (b :: Down a1) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type (a2 :: Down a1) == (b :: Down a1) = Equals_6989586621679801944 a2 b
type Apply (Compare_6989586621679801934Sym1 a6989586621679801932 :: TyFun (Down a) Ordering -> Type) (a6989586621679801933 :: Down a) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Apply (Compare_6989586621679801934Sym1 a6989586621679801932 :: TyFun (Down a) Ordering -> Type) (a6989586621679801933 :: Down a) = Compare_6989586621679801934 a6989586621679801932 a6989586621679801933
type Apply (Fmap_6989586621680106818Sym1 a6989586621680106816 :: TyFun (Down a) (Down b) -> Type) (a6989586621680106817 :: Down a) 
Instance details

Defined in Data.Singletons.Prelude.Functor

type Apply (Fmap_6989586621680106818Sym1 a6989586621680106816 :: TyFun (Down a) (Down b) -> Type) (a6989586621680106817 :: Down a) = Fmap_6989586621680106818 a6989586621680106816 a6989586621680106817
type Apply (TFHelper_6989586621680106830Sym1 a6989586621680106828 b :: TyFun (Down b) (Down a) -> Type) (a6989586621680106829 :: Down b) 
Instance details

Defined in Data.Singletons.Prelude.Functor

type Apply (TFHelper_6989586621680106830Sym1 a6989586621680106828 b :: TyFun (Down b) (Down a) -> Type) (a6989586621680106829 :: Down b) = TFHelper_6989586621680106830 a6989586621680106828 a6989586621680106829
type Apply (TFHelper_6989586621681393613Sym1 a6989586621681393611 :: TyFun (Down a) (Down b) -> Type) (a6989586621681393612 :: Down a) 
Instance details

Defined in Data.Singletons.Prelude.Applicative

type Apply (TFHelper_6989586621681393613Sym1 a6989586621681393611 :: TyFun (Down a) (Down b) -> Type) (a6989586621681393612 :: Down a) = TFHelper_6989586621681393613 a6989586621681393611 a6989586621681393612
type Apply (Compare_6989586621679801934Sym0 :: TyFun (Down a6989586621679801914) (Down a6989586621679801914 ~> Ordering) -> Type) (a6989586621679801932 :: Down a6989586621679801914) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Apply (Compare_6989586621679801934Sym0 :: TyFun (Down a6989586621679801914) (Down a6989586621679801914 ~> Ordering) -> Type) (a6989586621679801932 :: Down a6989586621679801914) = Compare_6989586621679801934Sym1 a6989586621679801932
type Apply (TFHelper_6989586621681402201Sym0 :: TyFun (Down a6989586621679962832) ((a6989586621679962832 ~> Down b6989586621679962833) ~> Down b6989586621679962833) -> Type) (a6989586621681402199 :: Down a6989586621679962832) 
Instance details

Defined in Data.Singletons.Prelude.Monad

type Apply (TFHelper_6989586621681402201Sym0 :: TyFun (Down a6989586621679962832) ((a6989586621679962832 ~> Down b6989586621679962833) ~> Down b6989586621679962833) -> Type) (a6989586621681402199 :: Down a6989586621679962832) = TFHelper_6989586621681402201Sym1 a6989586621681402199 b6989586621679962833 :: TyFun (a6989586621679962832 ~> Down b6989586621679962833) (Down b6989586621679962833) -> Type
type Apply (TFHelper_6989586621681393613Sym0 :: TyFun (Down (a6989586621679962809 ~> b6989586621679962810)) (Down a6989586621679962809 ~> Down b6989586621679962810) -> Type) (a6989586621681393611 :: Down (a6989586621679962809 ~> b6989586621679962810)) 
Instance details

Defined in Data.Singletons.Prelude.Applicative

type Apply (TFHelper_6989586621681393613Sym0 :: TyFun (Down (a6989586621679962809 ~> b6989586621679962810)) (Down a6989586621679962809 ~> Down b6989586621679962810) -> Type) (a6989586621681393611 :: Down (a6989586621679962809 ~> b6989586621679962810)) = TFHelper_6989586621681393613Sym1 a6989586621681393611
type Apply (TFHelper_6989586621681402201Sym1 a6989586621681402199 b :: TyFun (a ~> Down b) (Down b) -> Type) (a6989586621681402200 :: a ~> Down b) 
Instance details

Defined in Data.Singletons.Prelude.Monad

type Apply (TFHelper_6989586621681402201Sym1 a6989586621681402199 b :: TyFun (a ~> Down b) (Down b) -> Type) (a6989586621681402200 :: a ~> Down b) = TFHelper_6989586621681402201 a6989586621681402199 a6989586621681402200
type Apply (Fmap_6989586621680106818Sym0 :: TyFun (a6989586621679962803 ~> b6989586621679962804) (Down a6989586621679962803 ~> Down b6989586621679962804) -> Type) (a6989586621680106816 :: a6989586621679962803 ~> b6989586621679962804) 
Instance details

Defined in Data.Singletons.Prelude.Functor

type Apply (Fmap_6989586621680106818Sym0 :: TyFun (a6989586621679962803 ~> b6989586621679962804) (Down a6989586621679962803 ~> Down b6989586621679962804) -> Type) (a6989586621680106816 :: a6989586621679962803 ~> b6989586621679962804) = Fmap_6989586621680106818Sym1 a6989586621680106816

data Proxy (t :: k) #

Proxy is a type that holds no data, but has a phantom parameter of arbitrary type (or even kind). Its use is to provide type information, even though there is no value available of that type (or it may be too costly to create one).

Historically, Proxy :: Proxy a is a safer alternative to the undefined :: a idiom.

>>> Proxy :: Proxy (Void, Int -> Int)
Proxy

Proxy can even hold types of higher kinds,

>>> Proxy :: Proxy Either
Proxy
>>> Proxy :: Proxy Functor
Proxy
>>> Proxy :: Proxy complicatedStructure
Proxy

Constructors

Proxy 

Instances

Instances details
Generic1 (Proxy :: k -> Type)

Since: base-4.6.0.0

Instance details

Defined in GHC.Generics

Associated Types

type Rep1 Proxy :: k -> Type #

Methods

from1 :: forall (a :: k0). Proxy a -> Rep1 Proxy a #

to1 :: forall (a :: k0). Rep1 Proxy a -> Proxy a #

Monad (Proxy :: Type -> Type)

Since: base-4.7.0.0

Instance details

Defined in Data.Proxy

Methods

(>>=) :: Proxy a -> (a -> Proxy b) -> Proxy b #

(>>) :: Proxy a -> Proxy b -> Proxy b #

return :: a -> Proxy a #

Functor (Proxy :: Type -> Type)

Since: base-4.7.0.0

Instance details

Defined in Data.Proxy

Methods

fmap :: (a -> b) -> Proxy a -> Proxy b #

(<$) :: a -> Proxy b -> Proxy a #

Applicative (Proxy :: Type -> Type)

Since: base-4.7.0.0

Instance details

Defined in Data.Proxy

Methods

pure :: a -> Proxy a #

(<*>) :: Proxy (a -> b) -> Proxy a -> Proxy b #

liftA2 :: (a -> b -> c) -> Proxy a -> Proxy b -> Proxy c #

(*>) :: Proxy a -> Proxy b -> Proxy b #

(<*) :: Proxy a -> Proxy b -> Proxy a #

Foldable (Proxy :: Type -> Type)

Since: base-4.7.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => Proxy m -> m #

foldMap :: Monoid m => (a -> m) -> Proxy a -> m #

foldMap' :: Monoid m => (a -> m) -> Proxy a -> m #

foldr :: (a -> b -> b) -> b -> Proxy a -> b #

foldr' :: (a -> b -> b) -> b -> Proxy a -> b #

foldl :: (b -> a -> b) -> b -> Proxy a -> b #

foldl' :: (b -> a -> b) -> b -> Proxy a -> b #

foldr1 :: (a -> a -> a) -> Proxy a -> a #

foldl1 :: (a -> a -> a) -> Proxy a -> a #

toList :: Proxy a -> [a] #

null :: Proxy a -> Bool #

length :: Proxy a -> Int #

elem :: Eq a => a -> Proxy a -> Bool #

maximum :: Ord a => Proxy a -> a #

minimum :: Ord a => Proxy a -> a #

sum :: Num a => Proxy a -> a #

product :: Num a => Proxy a -> a #

Traversable (Proxy :: Type -> Type)

Since: base-4.7.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> Proxy a -> f (Proxy b) #

sequenceA :: Applicative f => Proxy (f a) -> f (Proxy a) #

mapM :: Monad m => (a -> m b) -> Proxy a -> m (Proxy b) #

sequence :: Monad m => Proxy (m a) -> m (Proxy a) #

Representable (Proxy :: Type -> Type) 
Instance details

Defined in Data.Functor.Rep

Associated Types

type Rep Proxy #

Methods

tabulate :: (Rep Proxy -> a) -> Proxy a #

index :: Proxy a -> Rep Proxy -> a #

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 #

NFData1 (Proxy :: Type -> Type)

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

liftRnf :: (a -> ()) -> Proxy a -> () #

Hashable1 (Proxy :: Type -> Type) 
Instance details

Defined in Data.Hashable.Class

Methods

liftHashWithSalt :: (Int -> a -> Int) -> Int -> Proxy a -> Int #

Bounded (Proxy t)

Since: base-4.7.0.0

Instance details

Defined in Data.Proxy

Methods

minBound :: Proxy t #

maxBound :: Proxy t #

Enum (Proxy s)

Since: base-4.7.0.0

Instance details

Defined in Data.Proxy

Methods

succ :: Proxy s -> Proxy s #

pred :: Proxy s -> Proxy s #

toEnum :: Int -> Proxy s #

fromEnum :: Proxy s -> Int #

enumFrom :: Proxy s -> [Proxy s] #

enumFromThen :: Proxy s -> Proxy s -> [Proxy s] #

enumFromTo :: Proxy s -> Proxy s -> [Proxy s] #

enumFromThenTo :: Proxy s -> Proxy s -> Proxy s -> [Proxy s] #

Eq (Proxy s)

Since: base-4.7.0.0

Instance details

Defined in Data.Proxy

Methods

(==) :: Proxy s -> Proxy s -> Bool #

(/=) :: Proxy s -> Proxy s -> Bool #

Data t => Data (Proxy t)

Since: base-4.7.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Proxy t -> c (Proxy t) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Proxy t) #

toConstr :: Proxy t -> Constr #

dataTypeOf :: Proxy t -> DataType #

dataCast1 :: Typeable t0 => (forall d. Data d => c (t0 d)) -> Maybe (c (Proxy t)) #

dataCast2 :: Typeable t0 => (forall d e. (Data d, Data e) => c (t0 d e)) -> Maybe (c (Proxy t)) #

gmapT :: (forall b. Data b => b -> b) -> Proxy t -> Proxy t #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Proxy t -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Proxy t -> r #

gmapQ :: (forall d. Data d => d -> u) -> Proxy t -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Proxy t -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Proxy t -> m (Proxy t) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Proxy t -> m (Proxy t) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Proxy t -> m (Proxy t) #

Ord (Proxy s)

Since: base-4.7.0.0

Instance details

Defined in Data.Proxy

Methods

compare :: Proxy s -> Proxy s -> Ordering #

(<) :: Proxy s -> Proxy s -> Bool #

(<=) :: Proxy s -> Proxy s -> Bool #

(>) :: Proxy s -> Proxy s -> Bool #

(>=) :: Proxy s -> Proxy s -> Bool #

max :: Proxy s -> Proxy s -> Proxy s #

min :: Proxy s -> Proxy s -> Proxy s #

Read (Proxy t)

Since: base-4.7.0.0

Instance details

Defined in Data.Proxy

Show (Proxy s)

Since: base-4.7.0.0

Instance details

Defined in Data.Proxy

Methods

showsPrec :: Int -> Proxy s -> ShowS #

show :: Proxy s -> String #

showList :: [Proxy s] -> ShowS #

Ix (Proxy s)

Since: base-4.7.0.0

Instance details

Defined in Data.Proxy

Methods

range :: (Proxy s, Proxy s) -> [Proxy s] #

index :: (Proxy s, Proxy s) -> Proxy s -> Int #

unsafeIndex :: (Proxy s, Proxy s) -> Proxy s -> Int #

inRange :: (Proxy s, Proxy s) -> Proxy s -> Bool #

rangeSize :: (Proxy s, Proxy s) -> Int #

unsafeRangeSize :: (Proxy s, Proxy s) -> Int #

Generic (Proxy t)

Since: base-4.6.0.0

Instance details

Defined in GHC.Generics

Associated Types

type Rep (Proxy t) :: Type -> Type #

Methods

from :: Proxy t -> Rep (Proxy t) x #

to :: Rep (Proxy t) x -> Proxy t #

Semigroup (Proxy s)

Since: base-4.9.0.0

Instance details

Defined in Data.Proxy

Methods

(<>) :: Proxy s -> Proxy s -> Proxy s #

sconcat :: NonEmpty (Proxy s) -> Proxy s #

stimes :: Integral b => b -> Proxy s -> Proxy s #

Monoid (Proxy s)

Since: base-4.7.0.0

Instance details

Defined in Data.Proxy

Methods

mempty :: Proxy s #

mappend :: Proxy s -> Proxy s -> Proxy s #

mconcat :: [Proxy s] -> Proxy s #

Hashable (Proxy a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Proxy a -> Int #

hash :: Proxy a -> Int #

NFData (Proxy a)

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Proxy a -> () #

type Rep1 (Proxy :: k -> Type) 
Instance details

Defined in GHC.Generics

type Rep1 (Proxy :: k -> Type) = D1 ('MetaData "Proxy" "Data.Proxy" "base" 'False) (C1 ('MetaCons "Proxy" 'PrefixI 'False) (U1 :: k -> Type))
type Rep (Proxy :: Type -> Type) 
Instance details

Defined in Data.Functor.Rep

type Rep (Proxy :: Type -> Type) = Void
type Rep (Proxy t) 
Instance details

Defined in GHC.Generics

type Rep (Proxy t) = D1 ('MetaData "Proxy" "Data.Proxy" "base" 'False) (C1 ('MetaCons "Proxy" 'PrefixI 'False) (U1 :: Type -> Type))

data IOMode #

Instances

Instances details
Enum IOMode

Since: base-4.2.0.0

Instance details

Defined in GHC.IO.IOMode

Eq IOMode

Since: base-4.2.0.0

Instance details

Defined in GHC.IO.IOMode

Methods

(==) :: IOMode -> IOMode -> Bool #

(/=) :: IOMode -> IOMode -> Bool #

Ord IOMode

Since: base-4.2.0.0

Instance details

Defined in GHC.IO.IOMode

Read IOMode

Since: base-4.2.0.0

Instance details

Defined in GHC.IO.IOMode

Show IOMode

Since: base-4.2.0.0

Instance details

Defined in GHC.IO.IOMode

Ix IOMode

Since: base-4.2.0.0

Instance details

Defined in GHC.IO.IOMode

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

integralEnumFromThenTo :: Integral a => a -> a -> a -> [a] #

integralEnumFromTo :: Integral a => a -> a -> [a] #

integralEnumFromThen :: (Integral a, Bounded a) => a -> a -> [a] #

integralEnumFrom :: (Integral a, Bounded a) => a -> [a] #

gcdInt' :: Int -> Int -> Int #

lcm :: Integral a => a -> a -> a #

lcm x y is the smallest positive integer that both x and y divide.

gcd :: Integral a => a -> a -> a #

gcd x y is the non-negative factor of both x and y of which every common factor of x and y is also a factor; for example gcd 4 2 = 2, gcd (-4) 6 = 2, gcd 0 4 = 4. gcd 0 0 = 0. (That is, the common divisor that is "greatest" in the divisibility preordering.)

Note: Since for signed fixed-width integer types, abs minBound < 0, the result may be negative if one of the arguments is minBound (and necessarily is if the other is 0 or minBound) for such types.

(^%^) :: Integral a => Rational -> a -> Rational #

(^^) :: (Fractional a, Integral b) => a -> b -> a infixr 8 #

raise a number to an integral power

odd :: Integral a => a -> Bool #

even :: Integral a => a -> Bool #

numericEnumFromThenTo :: (Ord a, Fractional a) => a -> a -> a -> [a] #

numericEnumFromTo :: (Ord a, Fractional a) => a -> a -> [a] #

numericEnumFromThen :: Fractional a => a -> a -> [a] #

numericEnumFrom :: Fractional a => a -> [a] #

denominator :: Ratio a -> a #

Extract the denominator of the ratio in reduced form: the numerator and denominator have no common factor and the denominator is positive.

numerator :: Ratio a -> a #

Extract the numerator of the ratio in reduced form: the numerator and denominator have no common factor and the denominator is positive.

reduce :: Integral a => a -> a -> Ratio a #

reduce is a subsidiary function used only in this module. It normalises a ratio by dividing both numerator and denominator by their greatest common divisor.

boundedEnumFromThen :: (Enum a, Bounded a) => a -> a -> [a] #

boundedEnumFrom :: (Enum a, Bounded a) => a -> [a] #

chr :: Int -> Char #

The toEnum method restricted to the type Char.

unzip3 :: [(a, b, c)] -> ([a], [b], [c]) #

The unzip3 function takes a list of triples and returns three lists, analogous to unzip.

unzip :: [(a, b)] -> ([a], [b]) #

unzip transforms a list of pairs into a list of first components and a list of second components.

zipWith :: (a -> b -> c) -> [a] -> [b] -> [c] #

O(min(m,n)). zipWith generalises zip by zipping with the function given as the first argument, instead of a tupling function. For example, zipWith (+) is applied to two lists to produce the list of corresponding sums:

>>> zipWith (+) [1, 2, 3] [4, 5, 6]
[5,7,9]

zipWith is right-lazy:

zipWith f [] _|_ = []

zipWith is capable of list fusion, but it is restricted to its first list argument and its resulting list.

zip3 :: [a] -> [b] -> [c] -> [(a, b, c)] #

zip3 takes three lists and returns a list of triples, analogous to zip. It is capable of list fusion, but it is restricted to its first list argument and its resulting list.

reverse :: [a] -> [a] #

reverse xs returns the elements of xs in reverse order. xs must be finite.

break :: (a -> Bool) -> [a] -> ([a], [a]) #

break, applied to a predicate p and a list xs, returns a tuple where first element is longest prefix (possibly empty) of xs of elements that do not satisfy p and second element is the remainder of the list:

break (> 3) [1,2,3,4,1,2,3,4] == ([1,2,3],[4,1,2,3,4])
break (< 9) [1,2,3] == ([],[1,2,3])
break (> 9) [1,2,3] == ([1,2,3],[])

break p is equivalent to span (not . p).

splitAt :: Int -> [a] -> ([a], [a]) #

splitAt n xs returns a tuple where first element is xs prefix of length n and second element is the remainder of the list:

splitAt 6 "Hello World!" == ("Hello ","World!")
splitAt 3 [1,2,3,4,5] == ([1,2,3],[4,5])
splitAt 1 [1,2,3] == ([1],[2,3])
splitAt 3 [1,2,3] == ([1,2,3],[])
splitAt 4 [1,2,3] == ([1,2,3],[])
splitAt 0 [1,2,3] == ([],[1,2,3])
splitAt (-1) [1,2,3] == ([],[1,2,3])

It is equivalent to (take n xs, drop n xs) when n is not _|_ (splitAt _|_ xs = _|_). splitAt is an instance of the more general genericSplitAt, in which n may be of any integral type.

drop :: Int -> [a] -> [a] #

drop n xs returns the suffix of xs after the first n elements, or [] if n > length xs:

drop 6 "Hello World!" == "World!"
drop 3 [1,2,3,4,5] == [4,5]
drop 3 [1,2] == []
drop 3 [] == []
drop (-1) [1,2] == [1,2]
drop 0 [1,2] == [1,2]

It is an instance of the more general genericDrop, in which n may be of any integral type.

take :: Int -> [a] -> [a] #

take n, applied to a list xs, returns the prefix of xs of length n, or xs itself if n > length xs:

take 5 "Hello World!" == "Hello"
take 3 [1,2,3,4,5] == [1,2,3]
take 3 [1,2] == [1,2]
take 3 [] == []
take (-1) [1,2] == []
take 0 [1,2] == []

It is an instance of the more general genericTake, in which n may be of any integral type.

dropWhile :: (a -> Bool) -> [a] -> [a] #

dropWhile p xs returns the suffix remaining after takeWhile p xs:

dropWhile (< 3) [1,2,3,4,5,1,2,3] == [3,4,5,1,2,3]
dropWhile (< 9) [1,2,3] == []
dropWhile (< 0) [1,2,3] == [1,2,3]

takeWhile :: (a -> Bool) -> [a] -> [a] #

takeWhile, applied to a predicate p and a list xs, returns the longest prefix (possibly empty) of xs of elements that satisfy p:

takeWhile (< 3) [1,2,3,4,1,2,3,4] == [1,2]
takeWhile (< 9) [1,2,3] == [1,2,3]
takeWhile (< 0) [1,2,3] == []

cycle :: [a] -> [a] #

cycle ties a finite list into a circular one, or equivalently, the infinite repetition of the original list. It is the identity on infinite lists.

replicate :: Int -> a -> [a] #

replicate n x is a list of length n with x the value of every element. It is an instance of the more general genericReplicate, in which n may be of any integral type.

repeat :: a -> [a] #

repeat x is an infinite list, with x the value of every element.

iterate :: (a -> a) -> a -> [a] #

iterate f x returns an infinite list of repeated applications of f to x:

iterate f x == [x, f x, f (f x), ...]

Note that iterate is lazy, potentially leading to thunk build-up if the consumer doesn't force each iterate. See iterate' for a strict variant of this function.

scanr :: (a -> b -> b) -> b -> [a] -> [b] #

O(n). scanr is the right-to-left dual of scanl. Note that

head (scanr f z xs) == foldr f z xs.

scanl :: (b -> a -> b) -> b -> [a] -> [b] #

O(n). scanl is similar to foldl, but returns a list of successive reduced values from the left:

scanl f z [x1, x2, ...] == [z, z `f` x1, (z `f` x1) `f` x2, ...]

Note that

last (scanl f z xs) == foldl f z xs.

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 given Just.

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

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
""

bool :: a -> a -> Bool -> a #

Case analysis for the Bool type. bool x y p evaluates to x when p is False, and evaluates to y when p is True.

This is equivalent to if p then y else x; that is, one can think of it as an if-then-else construct with its arguments reordered.

Examples

Expand

Basic usage:

>>> bool "foo" "bar" True
"bar"
>>> bool "foo" "bar" False
"foo"

Confirm that bool x y p and if p then y else x are equivalent:

>>> let p = True; x = "bar"; y = "foo"
>>> bool x y p == if p then y else x
True
>>> let p = False
>>> bool x y p == if p then y else x
True

Since: base-4.7.0.0

(&) :: a -> (a -> b) -> b infixl 1 #

& is a reverse application operator. This provides notational convenience. Its precedence is one higher than that of the forward application operator $, which allows & to be nested in $.

>>> 5 & (+1) & show
"6"

Since: base-4.8.0.0

on :: (b -> b -> c) -> (a -> b) -> a -> a -> c infixl 0 #

on b u x y runs the binary function b on the results of applying unary function u to two arguments x and y. From the opposite perspective, it transforms two inputs and combines the outputs.

((+) `on` f) x y = f x + f y

Typical usage: sortBy (compare `on` fst).

Algebraic properties:

  • (*) `on` id = (*) -- (if (*) ∉ {⊥, const ⊥})
  • ((*) `on` f) `on` g = (*) `on` (f . g)
  • flip on f . flip on g = flip on (g . f)

fix :: (a -> a) -> a #

fix f is the least fixed point of the function f, i.e. the least defined x such that f x = x.

For example, we can write the factorial function using direct recursion as

>>> let fac n = if n <= 1 then 1 else n * fac (n-1) in fac 5
120

This uses the fact that Haskell’s let introduces recursive bindings. We can rewrite this definition using fix,

>>> fix (\rec n -> if n <= 1 then 1 else n * rec (n-1)) 5
120

Instead of making a recursive call, we introduce a dummy parameter rec; when used within fix, this parameter then refers to fix argument, hence the recursion is reintroduced.

void :: Functor f => f a -> f () #

void value discards or ignores the result of evaluation, such as the return value of an IO action.

Examples

Expand

Replace the contents of a Maybe Int with unit:

>>> void Nothing
Nothing
>>> void (Just 3)
Just ()

Replace the contents of an Either Int Int with unit, resulting in an Either Int ():

>>> void (Left 8675309)
Left 8675309
>>> void (Right 8675309)
Right ()

Replace every element of a list with unit:

>>> void [1,2,3]
[(),(),()]

Replace the second element of a pair with unit:

>>> void (1,2)
(1,())

Discard the result of an IO action:

>>> mapM print [1,2]
1
2
[(),()]
>>> void $ mapM print [1,2]
1
2

($>) :: Functor f => f a -> b -> f b infixl 4 #

Flipped version of <$.

Examples

Expand

Replace the contents of a Maybe Int with a constant String:

>>> Nothing $> "foo"
Nothing
>>> Just 90210 $> "foo"
Just "foo"

Replace the contents of an Either Int Int with a constant String, resulting in an Either Int String:

>>> Left 8675309 $> "foo"
Left 8675309
>>> Right 8675309 $> "foo"
Right "foo"

Replace each element of a list with a constant String:

>>> [1,2,3] $> "foo"
["foo","foo","foo"]

Replace the second element of a pair with a constant String:

>>> (1,2) $> "foo"
(1,"foo")

Since: base-4.7.0.0

(<&>) :: Functor f => f a -> (a -> b) -> f b infixl 1 #

Flipped version of <$>.

(<&>) = flip fmap

Examples

Expand

Apply (+1) to a list, a Just and a Right:

>>> Just 2 <&> (+1)
Just 3
>>> [1,2,3] <&> (+1)
[2,3,4]
>>> Right 3 <&> (+1)
Right 4

Since: base-4.11.0.0

swap :: (a, b) -> (b, a) #

Swap the components of a pair.

uncurry :: (a -> b -> c) -> (a, b) -> c #

uncurry converts a curried function to a function on pairs.

Examples

Expand
>>> uncurry (+) (1,2)
3
>>> uncurry ($) (show, 1)
"1"
>>> map (uncurry max) [(1,2), (3,4), (6,8)]
[2,4,8]

curry :: ((a, b) -> c) -> a -> b -> c #

curry converts an uncurried function to a curried function.

Examples

Expand
>>> curry fst 1 2
1

data MVar a #

An MVar (pronounced "em-var") is a synchronising variable, used for communication between concurrent threads. It can be thought of as a box, which may be empty or full.

Instances

Instances details
NFData1 MVar

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

liftRnf :: (a -> ()) -> MVar a -> () #

Eq (MVar a)

Since: base-4.1.0.0

Instance details

Defined in GHC.MVar

Methods

(==) :: MVar a -> MVar a -> Bool #

(/=) :: MVar a -> MVar a -> Bool #

NFData (MVar a)

NOTE: Only strict in the reference and not the referenced value.

Since: deepseq-1.4.2.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: MVar a -> () #

subtract :: Num a => a -> a -> a #

the same as flip (-).

Because - is treated specially in the Haskell grammar, (- e) is not a section, but an application of prefix negation. However, (subtract exp) is equivalent to the disallowed section.

currentCallStack :: IO [String] #

Returns a [String] representing the current call stack. This can be useful for debugging.

The implementation uses the call-stack simulation maintained by the profiler, so it only works if the program was compiled with -prof and contains suitable SCC annotations (e.g. by using -fprof-auto). Otherwise, the list returned is likely to be empty or uninformative.

Since: base-4.5.0.0

asTypeOf :: a -> a -> a #

asTypeOf 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 second.

flip :: (a -> b -> c) -> b -> a -> c #

flip f takes its (first) two arguments in the reverse order of f.

>>> flip (++) "hello" "world"
"worldhello"

ord :: Char -> Int #

The fromEnum method restricted to the type Char.

ap :: Monad m => m (a -> b) -> m a -> m b #

In many situations, the liftM operations can be replaced by uses of ap, which promotes function application.

return f `ap` x1 `ap` ... `ap` xn

is equivalent to

liftMn f x1 x2 ... xn

liftM5 :: Monad m => (a1 -> a2 -> a3 -> a4 -> a5 -> r) -> m a1 -> m a2 -> m a3 -> m a4 -> m a5 -> m r #

Promote a function to a monad, scanning the monadic arguments from left to right (cf. liftM2).

liftM4 :: Monad m => (a1 -> a2 -> a3 -> a4 -> r) -> m a1 -> m a2 -> m a3 -> m a4 -> m r #

Promote a function to a monad, scanning the monadic arguments from left to right (cf. liftM2).

liftM3 :: Monad m => (a1 -> a2 -> a3 -> r) -> m a1 -> m a2 -> m a3 -> m r #

Promote a function to a monad, scanning the monadic arguments from left to right (cf. liftM2).

liftM2 :: Monad m => (a1 -> a2 -> r) -> m a1 -> m a2 -> m r #

Promote a function to a monad, scanning the monadic arguments from left to right. For example,

liftM2 (+) [0,1] [0,2] = [0,2,1,3]
liftM2 (+) (Just 1) Nothing = Nothing

(=<<) :: Monad m => (a -> m b) -> m a -> m b infixr 1 #

Same as >>=, but with the arguments interchanged.

liftA3 :: Applicative f => (a -> b -> c -> d) -> f a -> f b -> f c -> f d #

Lift a ternary function to actions.

(<**>) :: Applicative f => f a -> f (a -> b) -> f b infixl 4 #

A variant of <*> with the arguments reversed.

data NonEmpty a #

Non-empty (and non-strict) list type.

Since: base-4.9.0.0

Constructors

a :| [a] infixr 5 

Instances

Instances details
Monad NonEmpty

Since: base-4.9.0.0

Instance details

Defined in GHC.Base

Methods

(>>=) :: NonEmpty a -> (a -> NonEmpty b) -> NonEmpty b #

(>>) :: NonEmpty a -> NonEmpty b -> NonEmpty b #

return :: a -> NonEmpty a #

Functor NonEmpty

Since: base-4.9.0.0

Instance details

Defined in GHC.Base

Methods

fmap :: (a -> b) -> NonEmpty a -> NonEmpty b #

(<$) :: a -> NonEmpty b -> NonEmpty a #

Applicative NonEmpty

Since: base-4.9.0.0

Instance details

Defined in GHC.Base

Methods

pure :: a -> NonEmpty a #

(<*>) :: NonEmpty (a -> b) -> NonEmpty a -> NonEmpty b #

liftA2 :: (a -> b -> c) -> NonEmpty a -> NonEmpty b -> NonEmpty c #

(*>) :: NonEmpty a -> NonEmpty b -> NonEmpty b #

(<*) :: NonEmpty a -> NonEmpty b -> NonEmpty a #

Foldable NonEmpty

Since: base-4.9.0.0

Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => NonEmpty m -> m #

foldMap :: Monoid m => (a -> m) -> NonEmpty a -> m #

foldMap' :: Monoid m => (a -> m) -> NonEmpty a -> m #

foldr :: (a -> b -> b) -> b -> NonEmpty a -> b #

foldr' :: (a -> b -> b) -> b -> NonEmpty a -> b #

foldl :: (b -> a -> b) -> b -> NonEmpty a -> b #

foldl' :: (b -> a -> b) -> b -> NonEmpty a -> b #

foldr1 :: (a -> a -> a) -> NonEmpty a -> a #

foldl1 :: (a -> a -> a) -> NonEmpty a -> a #

toList :: NonEmpty a -> [a] #

null :: NonEmpty a -> Bool #

length :: NonEmpty a -> Int #

elem :: Eq a => a -> NonEmpty a -> Bool #

maximum :: Ord a => NonEmpty a -> a #

minimum :: Ord a => NonEmpty a -> a #

sum :: Num a => NonEmpty a -> a #

product :: Num a => NonEmpty a -> a #

Traversable NonEmpty

Since: base-4.9.0.0

Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> NonEmpty a -> f (NonEmpty b) #

sequenceA :: Applicative f => NonEmpty (f a) -> f (NonEmpty a) #

mapM :: Monad m => (a -> m b) -> NonEmpty a -> m (NonEmpty b) #

sequence :: Monad m => NonEmpty (m a) -> m (NonEmpty a) #

NFData1 NonEmpty

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

liftRnf :: (a -> ()) -> NonEmpty a -> () #

PTraversable NonEmpty 
Instance details

Defined in Data.Singletons.Prelude.Traversable

Associated Types

type Traverse arg0 arg1 :: f0 (t0 b0) #

type SequenceA arg0 :: f0 (t0 a0) #

type MapM arg0 arg1 :: m0 (t0 b0) #

type Sequence arg0 :: m0 (t0 a0) #

STraversable NonEmpty 
Instance details

Defined in Data.Singletons.Prelude.Traversable

Methods

sTraverse :: forall a (f :: Type -> Type) b (t1 :: a ~> f b) (t2 :: NonEmpty a). SApplicative f => Sing t1 -> Sing t2 -> Sing (Apply (Apply TraverseSym0 t1) t2) #

sSequenceA :: forall (f :: Type -> Type) a (t :: NonEmpty (f a)). SApplicative f => Sing t -> Sing (Apply SequenceASym0 t) #

sMapM :: forall a (m :: Type -> Type) b (t1 :: a ~> m b) (t2 :: NonEmpty a). SMonad m => Sing t1 -> Sing t2 -> Sing (Apply (Apply MapMSym0 t1) t2) #

sSequence :: forall (m :: Type -> Type) a (t :: NonEmpty (m a)). SMonad m => Sing t -> Sing (Apply SequenceSym0 t) #

PFoldable NonEmpty 
Instance details

Defined in Data.Singletons.Prelude.Foldable

Associated Types

type Fold arg0 :: m0 #

type FoldMap arg0 arg1 :: m0 #

type Foldr arg0 arg1 arg2 :: b0 #

type Foldr' arg0 arg1 arg2 :: b0 #

type Foldl arg0 arg1 arg2 :: b0 #

type Foldl' arg0 arg1 arg2 :: b0 #

type Foldr1 arg0 arg1 :: a0 #

type Foldl1 arg0 arg1 :: a0 #

type ToList arg0 :: [a0] #

type Null arg0 :: Bool #

type Length arg0 :: Nat #

type Elem arg0 arg1 :: Bool #

type Maximum arg0 :: a0 #

type Minimum arg0 :: a0 #

type Sum arg0 :: a0 #

type Product arg0 :: a0 #

SFoldable NonEmpty 
Instance details

Defined in Data.Singletons.Prelude.Foldable

Methods

sFold :: forall m (t :: NonEmpty m). SMonoid m => Sing t -> Sing (Apply FoldSym0 t) #

sFoldMap :: forall a m (t1 :: a ~> m) (t2 :: NonEmpty a). SMonoid m => Sing t1 -> Sing t2 -> Sing (Apply (Apply FoldMapSym0 t1) t2) #

sFoldr :: forall a b (t1 :: a ~> (b ~> b)) (t2 :: b) (t3 :: NonEmpty a). Sing t1 -> Sing t2 -> Sing t3 -> Sing (Apply (Apply (Apply FoldrSym0 t1) t2) t3) #

sFoldr' :: forall a b (t1 :: a ~> (b ~> b)) (t2 :: b) (t3 :: NonEmpty a). Sing t1 -> Sing t2 -> Sing t3 -> Sing (Apply (Apply (Apply Foldr'Sym0 t1) t2) t3) #

sFoldl :: forall b a (t1 :: b ~> (a ~> b)) (t2 :: b) (t3 :: NonEmpty a). Sing t1 -> Sing t2 -> Sing t3 -> Sing (Apply (Apply (Apply FoldlSym0 t1) t2) t3) #

sFoldl' :: forall b a (t1 :: b ~> (a ~> b)) (t2 :: b) (t3 :: NonEmpty a). Sing t1 -> Sing t2 -> Sing t3 -> Sing (Apply (Apply (Apply Foldl'Sym0 t1) t2) t3) #

sFoldr1 :: forall a (t1 :: a ~> (a ~> a)) (t2 :: NonEmpty a). Sing t1 -> Sing t2 -> Sing (Apply (Apply Foldr1Sym0 t1) t2) #

sFoldl1 :: forall a (t1 :: a ~> (a ~> a)) (t2 :: NonEmpty a). Sing t1 -> Sing t2 -> Sing (Apply (Apply Foldl1Sym0 t1) t2) #

sToList :: forall a (t :: NonEmpty a). Sing t -> Sing (Apply ToListSym0 t) #

sNull :: forall a (t :: NonEmpty a). Sing t -> Sing (Apply NullSym0 t) #

sLength :: forall a (t :: NonEmpty a). Sing t -> Sing (Apply LengthSym0 t) #

sElem :: forall a (t1 :: a) (t2 :: NonEmpty a). SEq a => Sing t1 -> Sing t2 -> Sing (Apply (Apply ElemSym0 t1) t2) #

sMaximum :: forall a (t :: NonEmpty a). SOrd a => Sing t -> Sing (Apply MaximumSym0 t) #

sMinimum :: forall a (t :: NonEmpty a). SOrd a => Sing t -> Sing (Apply MinimumSym0 t) #

sSum :: forall a (t :: NonEmpty a). SNum a => Sing t -> Sing (Apply SumSym0 t) #

sProduct :: forall a (t :: NonEmpty a). SNum a => Sing t -> Sing (Apply ProductSym0 t) #

PFunctor NonEmpty 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

Associated Types

type Fmap arg0 arg1 :: f0 b0 #

type arg0 <$ arg1 :: f0 a0 #

PApplicative NonEmpty 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

Associated Types

type Pure arg0 :: f0 a0 #

type arg0 <*> arg1 :: f0 b0 #

type LiftA2 arg0 arg1 arg2 :: f0 c0 #

type arg0 *> arg1 :: f0 b0 #

type arg0 <* arg1 :: f0 a0 #

PMonad NonEmpty 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

Associated Types

type arg0 >>= arg1 :: m0 b0 #

type arg0 >> arg1 :: m0 b0 #

type Return arg0 :: m0 a0 #

SFunctor NonEmpty 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

Methods

sFmap :: forall a b (t1 :: a ~> b) (t2 :: NonEmpty a). Sing t1 -> Sing t2 -> Sing (Apply (Apply FmapSym0 t1) t2) #

(%<$) :: forall a b (t1 :: a) (t2 :: NonEmpty b). Sing t1 -> Sing t2 -> Sing (Apply (Apply (<$@#@$) t1) t2) #

SApplicative NonEmpty 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

Methods

sPure :: forall a (t :: a). Sing t -> Sing (Apply PureSym0 t) #

(%<*>) :: forall a b (t1 :: NonEmpty (a ~> b)) (t2 :: NonEmpty a). Sing t1 -> Sing t2 -> Sing (Apply (Apply (<*>@#@$) t1) t2) #

sLiftA2 :: forall a b c (t1 :: a ~> (b ~> c)) (t2 :: NonEmpty a) (t3 :: NonEmpty b). Sing t1 -> Sing t2 -> Sing t3 -> Sing (Apply (Apply (Apply LiftA2Sym0 t1) t2) t3) #

(%*>) :: forall a b (t1 :: NonEmpty a) (t2 :: NonEmpty b). Sing t1 -> Sing t2 -> Sing (Apply (Apply (*>@#@$) t1) t2) #

(%<*) :: forall a b (t1 :: NonEmpty a) (t2 :: NonEmpty b). Sing t1 -> Sing t2 -> Sing (Apply (Apply (<*@#@$) t1) t2) #

SMonad NonEmpty 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

Methods

(%>>=) :: forall a b (t1 :: NonEmpty a) (t2 :: a ~> NonEmpty b). Sing t1 -> Sing t2 -> Sing (Apply (Apply (>>=@#@$) t1) t2) #

(%>>) :: forall a b (t1 :: NonEmpty a) (t2 :: NonEmpty b). Sing t1 -> Sing t2 -> Sing (Apply (Apply (>>@#@$) t1) t2) #

sReturn :: forall a (t :: a). Sing t -> Sing (Apply ReturnSym0 t) #

IsList (NonEmpty a)

Since: base-4.9.0.0

Instance details

Defined in GHC.Exts

Associated Types

type Item (NonEmpty a) #

Methods

fromList :: [Item (NonEmpty a)] -> NonEmpty a #

fromListN :: Int -> [Item (NonEmpty a)] -> NonEmpty a #

toList :: NonEmpty a -> [Item (NonEmpty a)] #

Eq a => Eq (NonEmpty a)

Since: base-4.9.0.0

Instance details

Defined in GHC.Base

Methods

(==) :: NonEmpty a -> NonEmpty a -> Bool #

(/=) :: NonEmpty a -> NonEmpty a -> Bool #

Data a => Data (NonEmpty a)

Since: base-4.9.0.0

Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> NonEmpty a -> c (NonEmpty a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (NonEmpty a) #

toConstr :: NonEmpty a -> Constr #

dataTypeOf :: NonEmpty a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (NonEmpty a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (NonEmpty a)) #

gmapT :: (forall b. Data b => b -> b) -> NonEmpty a -> NonEmpty a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> NonEmpty a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> NonEmpty a -> r #

gmapQ :: (forall d. Data d => d -> u) -> NonEmpty a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> NonEmpty a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> NonEmpty a -> m (NonEmpty a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> NonEmpty a -> m (NonEmpty a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> NonEmpty a -> m (NonEmpty a) #

Ord a => Ord (NonEmpty a)

Since: base-4.9.0.0

Instance details

Defined in GHC.Base

Methods

compare :: NonEmpty a -> NonEmpty a -> Ordering #

(<) :: NonEmpty a -> NonEmpty a -> Bool #

(<=) :: NonEmpty a -> NonEmpty a -> Bool #

(>) :: NonEmpty a -> NonEmpty a -> Bool #

(>=) :: NonEmpty a -> NonEmpty a -> Bool #

max :: NonEmpty a -> NonEmpty a -> NonEmpty a #

min :: NonEmpty a -> NonEmpty a -> NonEmpty a #

Read a => Read (NonEmpty a)

Since: base-4.11.0.0

Instance details

Defined in GHC.Read

Show a => Show (NonEmpty a)

Since: base-4.11.0.0

Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> NonEmpty a -> ShowS #

show :: NonEmpty a -> String #

showList :: [NonEmpty a] -> ShowS #

Generic (NonEmpty a)

Since: base-4.6.0.0

Instance details

Defined in GHC.Generics

Associated Types

type Rep (NonEmpty a) :: Type -> Type #

Methods

from :: NonEmpty a -> Rep (NonEmpty a) x #

to :: Rep (NonEmpty a) x -> NonEmpty a #

Semigroup (NonEmpty a)

Since: base-4.9.0.0

Instance details

Defined in GHC.Base

Methods

(<>) :: NonEmpty a -> NonEmpty a -> NonEmpty a #

sconcat :: NonEmpty (NonEmpty a) -> NonEmpty a #

stimes :: Integral b => b -> NonEmpty a -> NonEmpty a #

Lift a => Lift (NonEmpty a)

Since: template-haskell-2.15.0.0

Instance details

Defined in Language.Haskell.TH.Syntax

Methods

lift :: NonEmpty a -> Q Exp #

Hashable a => Hashable (NonEmpty a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> NonEmpty a -> Int #

hash :: NonEmpty a -> Int #

NFData a => NFData (NonEmpty a)

Since: deepseq-1.4.2.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: NonEmpty a -> () #

Ixed (NonEmpty a) 
Instance details

Defined in Control.Lens.At

Methods

ix :: Index (NonEmpty a) -> Traversal' (NonEmpty a) (IxValue (NonEmpty a)) #

Wrapped (NonEmpty a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (NonEmpty a) #

One (NonEmpty a) 
Instance details

Defined in Universum.Container.Class

Associated Types

type OneItem (NonEmpty a) #

Methods

one :: OneItem (NonEmpty a) -> NonEmpty a #

Container (NonEmpty a) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element (NonEmpty a) #

Methods

toList :: NonEmpty a -> [Element (NonEmpty a)] #

null :: NonEmpty a -> Bool #

foldr :: (Element (NonEmpty a) -> b -> b) -> b -> NonEmpty a -> b #

foldl :: (b -> Element (NonEmpty a) -> b) -> b -> NonEmpty a -> b #

foldl' :: (b -> Element (NonEmpty a) -> b) -> b -> NonEmpty a -> b #

length :: NonEmpty a -> Int #

elem :: Element (NonEmpty a) -> NonEmpty a -> Bool #

maximum :: NonEmpty a -> Element (NonEmpty a) #

minimum :: NonEmpty a -> Element (NonEmpty a) #

foldMap :: Monoid m => (Element (NonEmpty a) -> m) -> NonEmpty a -> m #

fold :: NonEmpty a -> Element (NonEmpty a) #

foldr' :: (Element (NonEmpty a) -> b -> b) -> b -> NonEmpty a -> b #

foldr1 :: (Element (NonEmpty a) -> Element (NonEmpty a) -> Element (NonEmpty a)) -> NonEmpty a -> Element (NonEmpty a) #

foldl1 :: (Element (NonEmpty a) -> Element (NonEmpty a) -> Element (NonEmpty a)) -> NonEmpty a -> Element (NonEmpty a) #

notElem :: Element (NonEmpty a) -> NonEmpty a -> Bool #

all :: (Element (NonEmpty a) -> Bool) -> NonEmpty a -> Bool #

any :: (Element (NonEmpty a) -> Bool) -> NonEmpty a -> Bool #

and :: NonEmpty a -> Bool #

or :: NonEmpty a -> Bool #

find :: (Element (NonEmpty a) -> Bool) -> NonEmpty a -> Maybe (Element (NonEmpty a)) #

safeHead :: NonEmpty a -> Maybe (Element (NonEmpty a)) #

PShow (NonEmpty a) 
Instance details

Defined in Data.Singletons.Prelude.Show

Associated Types

type ShowsPrec arg0 arg1 arg2 :: Symbol #

type Show_ arg0 :: Symbol #

type ShowList arg0 arg1 :: Symbol #

(SShow a, SShow [a]) => SShow (NonEmpty a) 
Instance details

Defined in Data.Singletons.Prelude.Show

Methods

sShowsPrec :: forall (t1 :: Nat) (t2 :: NonEmpty a) (t3 :: Symbol). Sing t1 -> Sing t2 -> Sing t3 -> Sing (Apply (Apply (Apply ShowsPrecSym0 t1) t2) t3) #

sShow_ :: forall (t :: NonEmpty a). Sing t -> Sing (Apply Show_Sym0 t) #

sShowList :: forall (t1 :: [NonEmpty a]) (t2 :: Symbol). Sing t1 -> Sing t2 -> Sing (Apply (Apply ShowListSym0 t1) t2) #

PSemigroup (NonEmpty a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

Associated Types

type arg0 <> arg1 :: a0 #

type Sconcat arg0 :: a0 #

SSemigroup (NonEmpty a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

Methods

(%<>) :: forall (t1 :: NonEmpty a) (t2 :: NonEmpty a). Sing t1 -> Sing t2 -> Sing (Apply (Apply (<>@#@$) t1) t2) #

sSconcat :: forall (t :: NonEmpty (NonEmpty a)). Sing t -> Sing (Apply SconcatSym0 t) #

POrd (NonEmpty a) 
Instance details

Defined in Data.Singletons.Prelude.Ord

Associated Types

type Compare arg0 arg1 :: Ordering #

type arg0 < arg1 :: Bool #

type arg0 <= arg1 :: Bool #

type arg0 > arg1 :: Bool #

type arg0 >= arg1 :: Bool #

type Max arg0 arg1 :: a0 #

type Min arg0 arg1 :: a0 #

(SOrd a, SOrd [a]) => SOrd (NonEmpty a) 
Instance details

Defined in Data.Singletons.Prelude.Ord

Methods

sCompare :: forall (t1 :: NonEmpty a) (t2 :: NonEmpty a). Sing t1 -> Sing t2 -> Sing (Apply (Apply CompareSym0 t1) t2) #

(%<) :: forall (t1 :: NonEmpty a) (t2 :: NonEmpty a). Sing t1 -> Sing t2 -> Sing (Apply (Apply (<@#@$) t1) t2) #

(%<=) :: forall (t1 :: NonEmpty a) (t2 :: NonEmpty a). Sing t1 -> Sing t2 -> Sing (Apply (Apply (<=@#@$) t1) t2) #

(%>) :: forall (t1 :: NonEmpty a) (t2 :: NonEmpty a). Sing t1 -> Sing t2 -> Sing (Apply (Apply (>@#@$) t1) t2) #

(%>=) :: forall (t1 :: NonEmpty a) (t2 :: NonEmpty a). Sing t1 -> Sing t2 -> Sing (Apply (Apply (>=@#@$) t1) t2) #

sMax :: forall (t1 :: NonEmpty a) (t2 :: NonEmpty a). Sing t1 -> Sing t2 -> Sing (Apply (Apply MaxSym0 t1) t2) #

sMin :: forall (t1 :: NonEmpty a) (t2 :: NonEmpty a). Sing t1 -> Sing t2 -> Sing (Apply (Apply MinSym0 t1) t2) #

(SEq a, SEq [a]) => SEq (NonEmpty a) 
Instance details

Defined in Data.Singletons.Prelude.Eq

Methods

(%==) :: forall (a0 :: NonEmpty a) (b :: NonEmpty a). Sing a0 -> Sing b -> Sing (a0 == b) #

(%/=) :: forall (a0 :: NonEmpty a) (b :: NonEmpty a). Sing a0 -> Sing b -> Sing (a0 /= b) #

PEq (NonEmpty a) 
Instance details

Defined in Data.Singletons.Prelude.Eq

Associated Types

type x == y :: Bool #

type x /= y :: Bool #

Generic1 NonEmpty

Since: base-4.6.0.0

Instance details

Defined in GHC.Generics

Associated Types

type Rep1 NonEmpty :: k -> Type #

Methods

from1 :: forall (a :: k). NonEmpty a -> Rep1 NonEmpty a #

to1 :: forall (a :: k). Rep1 NonEmpty a -> NonEmpty a #

t ~ NonEmpty b => Rewrapped (NonEmpty a) t 
Instance details

Defined in Control.Lens.Wrapped

(SDecide a, SDecide [a]) => TestCoercion (SNonEmpty :: NonEmpty a -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Instances

Methods

testCoercion :: forall (a0 :: k) (b :: k). SNonEmpty a0 -> SNonEmpty b -> Maybe (Coercion a0 b) #

(SDecide a, SDecide [a]) => TestEquality (SNonEmpty :: NonEmpty a -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Instances

Methods

testEquality :: forall (a0 :: k) (b :: k). SNonEmpty a0 -> SNonEmpty b -> Maybe (a0 :~: b) #

Each (NonEmpty a) (NonEmpty b) a b 
Instance details

Defined in Lens.Micro.Internal

Methods

each :: Traversal (NonEmpty a) (NonEmpty b) a b #

SingI ((:|@#@$) :: TyFun a ([a] ~> NonEmpty a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Instances

Methods

sing :: Sing (:|@#@$) #

SSemigroup a => SingI (SconcatSym0 :: TyFun (NonEmpty a) a -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (ShowsPrec_6989586621680595833Sym0 :: TyFun Nat (NonEmpty a6989586621679060149 ~> (Symbol ~> Symbol)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (Pure_6989586621680024367Sym0 :: TyFun a6989586621679962808 (NonEmpty a6989586621679962808) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

SuppressUnusedWarnings ((:|@#@$) :: TyFun a6989586621679060149 ([a6989586621679060149] ~> NonEmpty a6989586621679060149) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Instances

SuppressUnusedWarnings (Compare_6989586621679803314Sym0 :: TyFun (NonEmpty a6989586621679060149) (NonEmpty a6989586621679060149 ~> Ordering) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

SuppressUnusedWarnings (Sconcat_6989586621680187836Sym0 :: TyFun (NonEmpty a6989586621680187449) a6989586621680187449 -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (Sconcat_6989586621680187691Sym0 :: TyFun (NonEmpty a6989586621680187449) a6989586621680187449 -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SuppressUnusedWarnings (SconcatSym0 :: TyFun (NonEmpty a6989586621680187449) a6989586621680187449 -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

SingI d => SingI ((:|@#@$$) d :: TyFun [a] (NonEmpty a) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Instances

Methods

sing :: Sing ((:|@#@$$) d) #

SuppressUnusedWarnings ((:|@#@$$) t6989586621679707129 :: TyFun [a6989586621679060149] (NonEmpty a6989586621679060149) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Instances

SuppressUnusedWarnings (TFHelper_6989586621680024210Sym0 :: TyFun a6989586621679962805 (NonEmpty b6989586621679962806 ~> NonEmpty a6989586621679962805) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

SuppressUnusedWarnings (ShowsPrec_6989586621680595833Sym1 a6989586621680595830 a6989586621679060149 :: TyFun (NonEmpty a6989586621679060149) (Symbol ~> Symbol) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Show

SuppressUnusedWarnings (TFHelper_6989586621680024526Sym0 :: TyFun (NonEmpty a6989586621679962832) ((a6989586621679962832 ~> NonEmpty b6989586621679962833) ~> NonEmpty b6989586621679962833) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

SuppressUnusedWarnings (Compare_6989586621679803314Sym1 a6989586621679803312 :: TyFun (NonEmpty a6989586621679060149) Ordering -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Ord

SuppressUnusedWarnings (TFHelper_6989586621680024375Sym0 :: TyFun (NonEmpty (a6989586621679962809 ~> b6989586621679962810)) (NonEmpty a6989586621679962809 ~> NonEmpty b6989586621679962810) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

SuppressUnusedWarnings (Fmap_6989586621680024197Sym0 :: TyFun (a6989586621679962803 ~> b6989586621679962804) (NonEmpty a6989586621679962803 ~> NonEmpty b6989586621679962804) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

SuppressUnusedWarnings (Let6989586621680024535BsSym0 :: TyFun k1 (TyFun k (TyFun (k1 ~> NonEmpty a) [a] -> Type) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

SuppressUnusedWarnings (Let6989586621680024535Bs'Sym0 :: TyFun k (TyFun [a6989586621679962832] (TyFun (a6989586621679962832 ~> NonEmpty b6989586621679962833) [b6989586621679962833] -> Type) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

SuppressUnusedWarnings (Let6989586621680024535BSym0 :: TyFun k1 (TyFun k2 (TyFun (k1 ~> NonEmpty k3) k3 -> Type) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

SuppressUnusedWarnings (TFHelper_6989586621680024375Sym1 a6989586621680024373 :: TyFun (NonEmpty a6989586621679962809) (NonEmpty b6989586621679962810) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

SuppressUnusedWarnings (TFHelper_6989586621680024210Sym1 a6989586621680024208 b6989586621679962806 :: TyFun (NonEmpty b6989586621679962806) (NonEmpty a6989586621679962805) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

SuppressUnusedWarnings (Fmap_6989586621680024197Sym1 a6989586621680024195 :: TyFun (NonEmpty a6989586621679962803) (NonEmpty b6989586621679962804) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

SuppressUnusedWarnings (Traverse_6989586621680995085Sym0 :: TyFun (a6989586621680988964 ~> f6989586621680988963 b6989586621680988965) (NonEmpty a6989586621680988964 ~> f6989586621680988963 (NonEmpty b6989586621680988965)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

SuppressUnusedWarnings (TFHelper_6989586621680024526Sym1 a6989586621680024524 b6989586621679962833 :: TyFun (a6989586621679962832 ~> NonEmpty b6989586621679962833) (NonEmpty b6989586621679962833) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

SuppressUnusedWarnings (LiftA2_6989586621680024392Sym0 :: TyFun (a6989586621679962811 ~> (b6989586621679962812 ~> c6989586621679962813)) (NonEmpty a6989586621679962811 ~> (NonEmpty b6989586621679962812 ~> NonEmpty c6989586621679962813)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

SuppressUnusedWarnings (Let6989586621680024535Bs'Sym1 a6989586621680024532 :: TyFun [a6989586621679962832] (TyFun (a6989586621679962832 ~> NonEmpty b6989586621679962833) [b6989586621679962833] -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

SuppressUnusedWarnings (Let6989586621680024535ToListSym0 :: TyFun k1 (TyFun k2 (TyFun k3 (TyFun (NonEmpty k4) [k4] -> Type) -> Type) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

SuppressUnusedWarnings (Let6989586621680024535BsSym1 a6989586621680024532 :: TyFun k (TyFun (k1 ~> NonEmpty a) [a] -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

SuppressUnusedWarnings (Let6989586621680024535BSym1 a6989586621680024532 :: TyFun k2 (TyFun (k1 ~> NonEmpty k3) k3 -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

SuppressUnusedWarnings (Traverse_6989586621680995085Sym1 a6989586621680995083 :: TyFun (NonEmpty a6989586621680988964) (f6989586621680988963 (NonEmpty b6989586621680988965)) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

SuppressUnusedWarnings (LiftA2_6989586621680024392Sym1 a6989586621680024389 :: TyFun (NonEmpty a6989586621679962811) (NonEmpty b6989586621679962812 ~> NonEmpty c6989586621679962813) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

SuppressUnusedWarnings (Let6989586621680024535ToListSym1 a6989586621680024532 :: TyFun k2 (TyFun k3 (TyFun (NonEmpty k4) [k4] -> Type) -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

SuppressUnusedWarnings (LiftA2_6989586621680024392Sym2 a6989586621680024390 a6989586621680024389 :: TyFun (NonEmpty b6989586621679962812) (NonEmpty c6989586621679962813) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

SuppressUnusedWarnings (Let6989586621680024535BsSym2 as6989586621680024533 a6989586621680024532 :: TyFun (k1 ~> NonEmpty a) [a] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

SuppressUnusedWarnings (Let6989586621680024535Bs'Sym2 as6989586621680024533 a6989586621680024532 :: TyFun (a6989586621679962832 ~> NonEmpty b6989586621679962833) [b6989586621679962833] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

SuppressUnusedWarnings (Let6989586621680024535BSym2 as6989586621680024533 a6989586621680024532 :: TyFun (k1 ~> NonEmpty k3) k3 -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

SuppressUnusedWarnings (Let6989586621680024535ToListSym2 as6989586621680024533 a6989586621680024532 :: TyFun k3 (TyFun (NonEmpty k4) [k4] -> Type) -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

SuppressUnusedWarnings (Let6989586621680024535ToListSym3 f6989586621680024534 as6989586621680024533 a6989586621680024532 :: TyFun (NonEmpty k4) [k4] -> Type) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type Product (arg0 :: NonEmpty a0) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Product (arg0 :: NonEmpty a0) = Apply (Product_6989586621680743347Sym0 :: TyFun (NonEmpty a0) a0 -> Type) arg0
type Sum (arg0 :: NonEmpty a0) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Sum (arg0 :: NonEmpty a0) = Apply (Sum_6989586621680743334Sym0 :: TyFun (NonEmpty a0) a0 -> Type) arg0
type Minimum (arg0 :: NonEmpty a0) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Minimum (arg0 :: NonEmpty a0) = Apply (Minimum_6989586621680743321Sym0 :: TyFun (NonEmpty a0) a0 -> Type) arg0
type Maximum (arg0 :: NonEmpty a0) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Maximum (arg0 :: NonEmpty a0) = Apply (Maximum_6989586621680743308Sym0 :: TyFun (NonEmpty a0) a0 -> Type) arg0
type Length (arg0 :: NonEmpty a0) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Length (arg0 :: NonEmpty a0) = Apply (Length_6989586621680743270Sym0 :: TyFun (NonEmpty a0) Nat -> Type) arg0
type Null (arg0 :: NonEmpty a0) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Null (arg0 :: NonEmpty a0) = Apply (Null_6989586621680743249Sym0 :: TyFun (NonEmpty a0) Bool -> Type) arg0
type ToList (a :: NonEmpty a6989586621680742395) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type ToList (a :: NonEmpty a6989586621680742395) = Apply (ToList_6989586621680743688Sym0 :: TyFun (NonEmpty a6989586621680742395) [a6989586621680742395] -> Type) a
type Fold (a :: NonEmpty k2) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Fold (a :: NonEmpty k2) = Apply (Fold_6989586621680743680Sym0 :: TyFun (NonEmpty k2) k2 -> Type) a
type Pure (a :: k1) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type Pure (a :: k1) = Apply (Pure_6989586621680024367Sym0 :: TyFun k1 (NonEmpty k1) -> Type) a
type Return (arg0 :: a0) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type Return (arg0 :: a0) = Apply (Return_6989586621679963334Sym0 :: TyFun a0 (NonEmpty a0) -> Type) arg0
type Sequence (arg0 :: NonEmpty (m0 a0)) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type Sequence (arg0 :: NonEmpty (m0 a0)) = Apply (Sequence_6989586621680989026Sym0 :: TyFun (NonEmpty (m0 a0)) (m0 (NonEmpty a0)) -> Type) arg0
type SequenceA (arg0 :: NonEmpty (f0 a0)) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type SequenceA (arg0 :: NonEmpty (f0 a0)) = Apply (SequenceA_6989586621680989001Sym0 :: TyFun (NonEmpty (f0 a0)) (f0 (NonEmpty a0)) -> Type) arg0
type Elem (arg1 :: a0) (arg2 :: NonEmpty a0) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Elem (arg1 :: a0) (arg2 :: NonEmpty a0) = Apply (Apply (Elem_6989586621680743293Sym0 :: TyFun a0 (NonEmpty a0 ~> Bool) -> Type) arg1) arg2
type Foldl1 (a1 :: k2 ~> (k2 ~> k2)) (a2 :: NonEmpty k2) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Foldl1 (a1 :: k2 ~> (k2 ~> k2)) (a2 :: NonEmpty k2) = Apply (Apply (Foldl1_6989586621680743629Sym0 :: TyFun (k2 ~> (k2 ~> k2)) (NonEmpty k2 ~> k2) -> Type) a1) a2
type Foldr1 (a1 :: k2 ~> (k2 ~> k2)) (a2 :: NonEmpty k2) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Foldr1 (a1 :: k2 ~> (k2 ~> k2)) (a2 :: NonEmpty k2) = Apply (Apply (Foldr1_6989586621680743642Sym0 :: TyFun (k2 ~> (k2 ~> k2)) (NonEmpty k2 ~> k2) -> Type) a1) a2
type FoldMap (a1 :: a6989586621680742384 ~> k2) (a2 :: NonEmpty a6989586621680742384) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type FoldMap (a1 :: a6989586621680742384 ~> k2) (a2 :: NonEmpty a6989586621680742384) = Apply (Apply (FoldMap_6989586621680743668Sym0 :: TyFun (a6989586621680742384 ~> k2) (NonEmpty a6989586621680742384 ~> k2) -> Type) a1) a2
type (a1 :: k1) <$ (a2 :: NonEmpty b6989586621679962806) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type (a1 :: k1) <$ (a2 :: NonEmpty b6989586621679962806) = Apply (Apply (TFHelper_6989586621680024210Sym0 :: TyFun k1 (NonEmpty b6989586621679962806 ~> NonEmpty k1) -> Type) a1) a2
type Fmap (a1 :: a6989586621679962803 ~> b6989586621679962804) (a2 :: NonEmpty a6989586621679962803) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type Fmap (a1 :: a6989586621679962803 ~> b6989586621679962804) (a2 :: NonEmpty a6989586621679962803) = Apply (Apply (Fmap_6989586621680024197Sym0 :: TyFun (a6989586621679962803 ~> b6989586621679962804) (NonEmpty a6989586621679962803 ~> NonEmpty b6989586621679962804) -> Type) a1) a2
type (arg1 :: NonEmpty a0) <* (arg2 :: NonEmpty b0) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type (arg1 :: NonEmpty a0) <* (arg2 :: NonEmpty b0) = Apply (Apply (TFHelper_6989586621679963287Sym0 :: TyFun (NonEmpty a0) (NonEmpty b0 ~> NonEmpty a0) -> Type) arg1) arg2
type (arg1 :: NonEmpty a0) *> (arg2 :: NonEmpty b0) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type (arg1 :: NonEmpty a0) *> (arg2 :: NonEmpty b0) = Apply (Apply (TFHelper_6989586621679963275Sym0 :: TyFun (NonEmpty a0) (NonEmpty b0 ~> NonEmpty b0) -> Type) arg1) arg2
type (a1 :: NonEmpty (a6989586621679962809 ~> b6989586621679962810)) <*> (a2 :: NonEmpty a6989586621679962809) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type (a1 :: NonEmpty (a6989586621679962809 ~> b6989586621679962810)) <*> (a2 :: NonEmpty a6989586621679962809) = Apply (Apply (TFHelper_6989586621680024375Sym0 :: TyFun (NonEmpty (a6989586621679962809 ~> b6989586621679962810)) (NonEmpty a6989586621679962809 ~> NonEmpty b6989586621679962810) -> Type) a1) a2
type (arg1 :: NonEmpty a0) >> (arg2 :: NonEmpty b0) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type (arg1 :: NonEmpty a0) >> (arg2 :: NonEmpty b0) = Apply (Apply (TFHelper_6989586621679963313Sym0 :: TyFun (NonEmpty a0) (NonEmpty b0 ~> NonEmpty b0) -> Type) arg1) arg2
type (a1 :: NonEmpty a6989586621679962832) >>= (a2 :: a6989586621679962832 ~> NonEmpty b6989586621679962833) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type (a1 :: NonEmpty a6989586621679962832) >>= (a2 :: a6989586621679962832 ~> NonEmpty b6989586621679962833) = Apply (Apply (TFHelper_6989586621680024526Sym0 :: TyFun (NonEmpty a6989586621679962832) ((a6989586621679962832 ~> NonEmpty b6989586621679962833) ~> NonEmpty b6989586621679962833) -> Type) a1) a2
type MapM (arg1 :: a0 ~> m0 b0) (arg2 :: NonEmpty a0) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type MapM (arg1 :: a0 ~> m0 b0) (arg2 :: NonEmpty a0) = Apply (Apply (MapM_6989586621680989011Sym0 :: TyFun (a0 ~> m0 b0) (NonEmpty a0 ~> m0 (NonEmpty b0)) -> Type) arg1) arg2
type Traverse (a1 :: a6989586621680988964 ~> f6989586621680988963 b6989586621680988965) (a2 :: NonEmpty a6989586621680988964) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type Traverse (a1 :: a6989586621680988964 ~> f6989586621680988963 b6989586621680988965) (a2 :: NonEmpty a6989586621680988964) = Apply (Apply (Traverse_6989586621680995085Sym0 :: TyFun (a6989586621680988964 ~> f6989586621680988963 b6989586621680988965) (NonEmpty a6989586621680988964 ~> f6989586621680988963 (NonEmpty b6989586621680988965)) -> Type) a1) a2
type Foldl' (arg1 :: b0 ~> (a0 ~> b0)) (arg2 :: b0) (arg3 :: NonEmpty a0) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Foldl' (arg1 :: b0 ~> (a0 ~> b0)) (arg2 :: b0) (arg3 :: NonEmpty a0) = Apply (Apply (Apply (Foldl'_6989586621680743162Sym0 :: TyFun (b0 ~> (a0 ~> b0)) (b0 ~> (NonEmpty a0 ~> b0)) -> Type) arg1) arg2) arg3
type Foldl (a1 :: k2 ~> (a6989586621680742390 ~> k2)) (a2 :: k2) (a3 :: NonEmpty a6989586621680742390) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Foldl (a1 :: k2 ~> (a6989586621680742390 ~> k2)) (a2 :: k2) (a3 :: NonEmpty a6989586621680742390) = Apply (Apply (Apply (Foldl_6989586621680743612Sym0 :: TyFun (k2 ~> (a6989586621680742390 ~> k2)) (k2 ~> (NonEmpty a6989586621680742390 ~> k2)) -> Type) a1) a2) a3
type Foldr' (arg1 :: a0 ~> (b0 ~> b0)) (arg2 :: b0) (arg3 :: NonEmpty a0) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Foldr' (arg1 :: a0 ~> (b0 ~> b0)) (arg2 :: b0) (arg3 :: NonEmpty a0) = Apply (Apply (Apply (Foldr'_6989586621680743107Sym0 :: TyFun (a0 ~> (b0 ~> b0)) (b0 ~> (NonEmpty a0 ~> b0)) -> Type) arg1) arg2) arg3
type Foldr (a1 :: a6989586621680742385 ~> (k2 ~> k2)) (a2 :: k2) (a3 :: NonEmpty a6989586621680742385) 
Instance details

Defined in Data.Singletons.Prelude.Foldable

type Foldr (a1 :: a6989586621680742385 ~> (k2 ~> k2)) (a2 :: k2) (a3 :: NonEmpty a6989586621680742385) = Apply (Apply (Apply (Foldr_6989586621680743594Sym0 :: TyFun (a6989586621680742385 ~> (k2 ~> k2)) (k2 ~> (NonEmpty a6989586621680742385 ~> k2)) -> Type) a1) a2) a3
type LiftA2 (a1 :: a6989586621679962811 ~> (b6989586621679962812 ~> c6989586621679962813)) (a2 :: NonEmpty a6989586621679962811) (a3 :: NonEmpty b6989586621679962812) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type LiftA2 (a1 :: a6989586621679962811 ~> (b6989586621679962812 ~> c6989586621679962813)) (a2 :: NonEmpty a6989586621679962811) (a3 :: NonEmpty b6989586621679962812) = Apply (Apply (Apply (LiftA2_6989586621680024392Sym0 :: TyFun (a6989586621679962811 ~> (b6989586621679962812 ~> c6989586621679962813)) (NonEmpty a6989586621679962811 ~> (NonEmpty b6989586621679962812 ~> NonEmpty c6989586621679962813)) -> Type) a1) a2) a3
type Apply (Pure_6989586621680024367Sym0 :: TyFun a (NonEmpty a) -> Type) (a6989586621680024366 :: a) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type Apply (Pure_6989586621680024367Sym0 :: TyFun a (NonEmpty a) -> Type) (a6989586621680024366 :: a) = Pure_6989586621680024367 a6989586621680024366
type Apply (ShowsPrec_6989586621680595833Sym0 :: TyFun Nat (NonEmpty a6989586621679060149 ~> (Symbol ~> Symbol)) -> Type) (a6989586621680595830 :: Nat) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680595833Sym0 :: TyFun Nat (NonEmpty a6989586621679060149 ~> (Symbol ~> Symbol)) -> Type) (a6989586621680595830 :: Nat) = ShowsPrec_6989586621680595833Sym1 a6989586621680595830 a6989586621679060149 :: TyFun (NonEmpty a6989586621679060149) (Symbol ~> Symbol) -> Type
type Apply ((:|@#@$) :: TyFun a6989586621679060149 ([a6989586621679060149] ~> NonEmpty a6989586621679060149) -> Type) (t6989586621679707129 :: a6989586621679060149) 
Instance details

Defined in Data.Singletons.Prelude.Instances

type Apply ((:|@#@$) :: TyFun a6989586621679060149 ([a6989586621679060149] ~> NonEmpty a6989586621679060149) -> Type) (t6989586621679707129 :: a6989586621679060149) = (:|@#@$$) t6989586621679707129
type Apply (TFHelper_6989586621680024210Sym0 :: TyFun a6989586621679962805 (NonEmpty b6989586621679962806 ~> NonEmpty a6989586621679962805) -> Type) (a6989586621680024208 :: a6989586621679962805) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type Apply (TFHelper_6989586621680024210Sym0 :: TyFun a6989586621679962805 (NonEmpty b6989586621679962806 ~> NonEmpty a6989586621679962805) -> Type) (a6989586621680024208 :: a6989586621679962805) = TFHelper_6989586621680024210Sym1 a6989586621680024208 b6989586621679962806 :: TyFun (NonEmpty b6989586621679962806) (NonEmpty a6989586621679962805) -> Type
type Apply (Let6989586621680024535Bs'Sym0 :: TyFun k (TyFun [a6989586621679962832] (TyFun (a6989586621679962832 ~> NonEmpty b6989586621679962833) [b6989586621679962833] -> Type) -> Type) -> Type) (a6989586621680024532 :: k) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type Apply (Let6989586621680024535Bs'Sym0 :: TyFun k (TyFun [a6989586621679962832] (TyFun (a6989586621679962832 ~> NonEmpty b6989586621679962833) [b6989586621679962833] -> Type) -> Type) -> Type) (a6989586621680024532 :: k) = Let6989586621680024535Bs'Sym1 a6989586621680024532 :: TyFun [a6989586621679962832] (TyFun (a6989586621679962832 ~> NonEmpty b6989586621679962833) [b6989586621679962833] -> Type) -> Type
type Apply (Let6989586621680024535BSym0 :: TyFun k1 (TyFun k2 (TyFun (k1 ~> NonEmpty k3) k3 -> Type) -> Type) -> Type) (a6989586621680024532 :: k1) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type Apply (Let6989586621680024535BSym0 :: TyFun k1 (TyFun k2 (TyFun (k1 ~> NonEmpty k3) k3 -> Type) -> Type) -> Type) (a6989586621680024532 :: k1) = Let6989586621680024535BSym1 a6989586621680024532 :: TyFun k2 (TyFun (k1 ~> NonEmpty k3) k3 -> Type) -> Type
type Apply (Let6989586621680024535BsSym0 :: TyFun k1 (TyFun k (TyFun (k1 ~> NonEmpty a) [a] -> Type) -> Type) -> Type) (a6989586621680024532 :: k1) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type Apply (Let6989586621680024535BsSym0 :: TyFun k1 (TyFun k (TyFun (k1 ~> NonEmpty a) [a] -> Type) -> Type) -> Type) (a6989586621680024532 :: k1) = Let6989586621680024535BsSym1 a6989586621680024532 :: TyFun k (TyFun (k1 ~> NonEmpty a) [a] -> Type) -> Type
type Apply (Let6989586621680024535ToListSym0 :: TyFun k1 (TyFun k2 (TyFun k3 (TyFun (NonEmpty k4) [k4] -> Type) -> Type) -> Type) -> Type) (a6989586621680024532 :: k1) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type Apply (Let6989586621680024535ToListSym0 :: TyFun k1 (TyFun k2 (TyFun k3 (TyFun (NonEmpty k4) [k4] -> Type) -> Type) -> Type) -> Type) (a6989586621680024532 :: k1) = Let6989586621680024535ToListSym1 a6989586621680024532 :: TyFun k2 (TyFun k3 (TyFun (NonEmpty k4) [k4] -> Type) -> Type) -> Type
type Apply (Let6989586621680024535BSym1 a6989586621680024532 :: TyFun k2 (TyFun (k1 ~> NonEmpty k3) k3 -> Type) -> Type) (as6989586621680024533 :: k2) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type Apply (Let6989586621680024535BSym1 a6989586621680024532 :: TyFun k2 (TyFun (k1 ~> NonEmpty k3) k3 -> Type) -> Type) (as6989586621680024533 :: k2) = Let6989586621680024535BSym2 a6989586621680024532 as6989586621680024533 :: TyFun (k1 ~> NonEmpty k3) k3 -> Type
type Apply (Let6989586621680024535BsSym1 a6989586621680024532 :: TyFun k (TyFun (k1 ~> NonEmpty a) [a] -> Type) -> Type) (as6989586621680024533 :: k) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type Apply (Let6989586621680024535BsSym1 a6989586621680024532 :: TyFun k (TyFun (k1 ~> NonEmpty a) [a] -> Type) -> Type) (as6989586621680024533 :: k) = Let6989586621680024535BsSym2 a6989586621680024532 as6989586621680024533 :: TyFun (k1 ~> NonEmpty a) [a] -> Type
type Apply (Let6989586621680024535ToListSym1 a6989586621680024532 :: TyFun k2 (TyFun k3 (TyFun (NonEmpty k4) [k4] -> Type) -> Type) -> Type) (as6989586621680024533 :: k2) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type Apply (Let6989586621680024535ToListSym1 a6989586621680024532 :: TyFun k2 (TyFun k3 (TyFun (NonEmpty k4) [k4] -> Type) -> Type) -> Type) (as6989586621680024533 :: k2) = Let6989586621680024535ToListSym2 a6989586621680024532 as6989586621680024533 :: TyFun k3 (TyFun (NonEmpty k4) [k4] -> Type) -> Type
type Apply (Let6989586621680024535ToListSym2 as6989586621680024533 a6989586621680024532 :: TyFun k3 (TyFun (NonEmpty k4) [k4] -> Type) -> Type) (f6989586621680024534 :: k3) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type Apply (Let6989586621680024535ToListSym2 as6989586621680024533 a6989586621680024532 :: TyFun k3 (TyFun (NonEmpty k4) [k4] -> Type) -> Type) (f6989586621680024534 :: k3) = Let6989586621680024535ToListSym3 as6989586621680024533 a6989586621680024532 f6989586621680024534 :: TyFun (NonEmpty k4) [k4] -> Type
type Rep (NonEmpty a) 
Instance details

Defined in GHC.Generics

type Item (NonEmpty a) 
Instance details

Defined in GHC.Exts

type Item (NonEmpty a) = a
type Index (NonEmpty a) 
Instance details

Defined in Control.Lens.At

type Index (NonEmpty a) = Int
type IxValue (NonEmpty a) 
Instance details

Defined in Control.Lens.At

type IxValue (NonEmpty a) = a
type Unwrapped (NonEmpty a) 
Instance details

Defined in Control.Lens.Wrapped

type Unwrapped (NonEmpty a) = (a, [a])
type Sing 
Instance details

Defined in Data.Singletons.Prelude.Instances

type Sing = SNonEmpty :: NonEmpty a -> Type
type OneItem (NonEmpty a) 
Instance details

Defined in Universum.Container.Class

type OneItem (NonEmpty a) = a
type Element (NonEmpty a) 
Instance details

Defined in Universum.Container.Class

type Element (NonEmpty a) = ElementDefault (NonEmpty a)
type Demote (NonEmpty a) 
Instance details

Defined in Data.Singletons.Prelude.Instances

type Rep1 NonEmpty 
Instance details

Defined in GHC.Generics

type Show_ (arg0 :: NonEmpty a) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Show_ (arg0 :: NonEmpty a) = Apply (Show__6989586621680577846Sym0 :: TyFun (NonEmpty a) Symbol -> Type) arg0
type Sconcat (arg0 :: NonEmpty (NonEmpty a)) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Sconcat (arg0 :: NonEmpty (NonEmpty a)) = Apply (Sconcat_6989586621680187691Sym0 :: TyFun (NonEmpty (NonEmpty a)) (NonEmpty a) -> Type) arg0
type ShowList (arg1 :: [NonEmpty a]) arg2 
Instance details

Defined in Data.Singletons.Prelude.Show

type ShowList (arg1 :: [NonEmpty a]) arg2 = Apply (Apply (ShowList_6989586621680577854Sym0 :: TyFun [NonEmpty a] (Symbol ~> Symbol) -> Type) arg1) arg2
type (a2 :: NonEmpty a1) <> (a3 :: NonEmpty a1) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type (a2 :: NonEmpty a1) <> (a3 :: NonEmpty a1) = Apply (Apply (TFHelper_6989586621680187794Sym0 :: TyFun (NonEmpty a1) (NonEmpty a1 ~> NonEmpty a1) -> Type) a2) a3
type Min (arg1 :: NonEmpty a) (arg2 :: NonEmpty a) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Min (arg1 :: NonEmpty a) (arg2 :: NonEmpty a) = Apply (Apply (Min_6989586621679792614Sym0 :: TyFun (NonEmpty a) (NonEmpty a ~> NonEmpty a) -> Type) arg1) arg2
type Max (arg1 :: NonEmpty a) (arg2 :: NonEmpty a) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Max (arg1 :: NonEmpty a) (arg2 :: NonEmpty a) = Apply (Apply (Max_6989586621679792596Sym0 :: TyFun (NonEmpty a) (NonEmpty a ~> NonEmpty a) -> Type) arg1) arg2
type (arg1 :: NonEmpty a) >= (arg2 :: NonEmpty a) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type (arg1 :: NonEmpty a) >= (arg2 :: NonEmpty a) = Apply (Apply (TFHelper_6989586621679792578Sym0 :: TyFun (NonEmpty a) (NonEmpty a ~> Bool) -> Type) arg1) arg2
type (arg1 :: NonEmpty a) > (arg2 :: NonEmpty a) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type (arg1 :: NonEmpty a) > (arg2 :: NonEmpty a) = Apply (Apply (TFHelper_6989586621679792560Sym0 :: TyFun (NonEmpty a) (NonEmpty a ~> Bool) -> Type) arg1) arg2
type (arg1 :: NonEmpty a) <= (arg2 :: NonEmpty a) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type (arg1 :: NonEmpty a) <= (arg2 :: NonEmpty a) = Apply (Apply (TFHelper_6989586621679792542Sym0 :: TyFun (NonEmpty a) (NonEmpty a ~> Bool) -> Type) arg1) arg2
type (arg1 :: NonEmpty a) < (arg2 :: NonEmpty a) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type (arg1 :: NonEmpty a) < (arg2 :: NonEmpty a) = Apply (Apply (TFHelper_6989586621679792524Sym0 :: TyFun (NonEmpty a) (NonEmpty a ~> Bool) -> Type) arg1) arg2
type Compare (a2 :: NonEmpty a1) (a3 :: NonEmpty a1) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Compare (a2 :: NonEmpty a1) (a3 :: NonEmpty a1) = Apply (Apply (Compare_6989586621679803314Sym0 :: TyFun (NonEmpty a1) (NonEmpty a1 ~> Ordering) -> Type) a2) a3
type (x :: NonEmpty a) /= (y :: NonEmpty a) 
Instance details

Defined in Data.Singletons.Prelude.Eq

type (x :: NonEmpty a) /= (y :: NonEmpty a) = Not (x == y)
type (a2 :: NonEmpty a1) == (b :: NonEmpty a1) 
Instance details

Defined in Data.Singletons.Prelude.Eq

type (a2 :: NonEmpty a1) == (b :: NonEmpty a1) = Equals_6989586621679776143 a2 b
type ShowsPrec a2 (a3 :: NonEmpty a1) a4 
Instance details

Defined in Data.Singletons.Prelude.Show

type ShowsPrec a2 (a3 :: NonEmpty a1) a4 = Apply (Apply (Apply (ShowsPrec_6989586621680595833Sym0 :: TyFun Nat (NonEmpty a1 ~> (Symbol ~> Symbol)) -> Type) a2) a3) a4
type Apply (Sconcat_6989586621680187691Sym0 :: TyFun (NonEmpty a) a -> Type) (a6989586621680187690 :: NonEmpty a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (Sconcat_6989586621680187691Sym0 :: TyFun (NonEmpty a) a -> Type) (a6989586621680187690 :: NonEmpty a) = Sconcat_6989586621680187691 a6989586621680187690
type Apply (SconcatSym0 :: TyFun (NonEmpty a) a -> Type) (arg6989586621680187688 :: NonEmpty a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (SconcatSym0 :: TyFun (NonEmpty a) a -> Type) (arg6989586621680187688 :: NonEmpty a) = Sconcat arg6989586621680187688
type Apply (Sconcat_6989586621680187836Sym0 :: TyFun (NonEmpty a) a -> Type) (a6989586621680187835 :: NonEmpty a) 
Instance details

Defined in Data.Singletons.Prelude.Semigroup.Internal

type Apply (Sconcat_6989586621680187836Sym0 :: TyFun (NonEmpty a) a -> Type) (a6989586621680187835 :: NonEmpty a) = Sconcat_6989586621680187836 a6989586621680187835
type Apply (Compare_6989586621679803314Sym1 a6989586621679803312 :: TyFun (NonEmpty a) Ordering -> Type) (a6989586621679803313 :: NonEmpty a) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Apply (Compare_6989586621679803314Sym1 a6989586621679803312 :: TyFun (NonEmpty a) Ordering -> Type) (a6989586621679803313 :: NonEmpty a) = Compare_6989586621679803314 a6989586621679803312 a6989586621679803313
type Apply ((:|@#@$$) t6989586621679707129 :: TyFun [a] (NonEmpty a) -> Type) (t6989586621679707130 :: [a]) 
Instance details

Defined in Data.Singletons.Prelude.Instances

type Apply ((:|@#@$$) t6989586621679707129 :: TyFun [a] (NonEmpty a) -> Type) (t6989586621679707130 :: [a]) = t6989586621679707129 :| t6989586621679707130
type Apply (Fmap_6989586621680024197Sym1 a6989586621680024195 :: TyFun (NonEmpty a) (NonEmpty b) -> Type) (a6989586621680024196 :: NonEmpty a) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type Apply (Fmap_6989586621680024197Sym1 a6989586621680024195 :: TyFun (NonEmpty a) (NonEmpty b) -> Type) (a6989586621680024196 :: NonEmpty a) = Fmap_6989586621680024197 a6989586621680024195 a6989586621680024196
type Apply (TFHelper_6989586621680024210Sym1 a6989586621680024208 b :: TyFun (NonEmpty b) (NonEmpty a) -> Type) (a6989586621680024209 :: NonEmpty b) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type Apply (TFHelper_6989586621680024210Sym1 a6989586621680024208 b :: TyFun (NonEmpty b) (NonEmpty a) -> Type) (a6989586621680024209 :: NonEmpty b) = TFHelper_6989586621680024210 a6989586621680024208 a6989586621680024209
type Apply (TFHelper_6989586621680024375Sym1 a6989586621680024373 :: TyFun (NonEmpty a) (NonEmpty b) -> Type) (a6989586621680024374 :: NonEmpty a) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type Apply (TFHelper_6989586621680024375Sym1 a6989586621680024373 :: TyFun (NonEmpty a) (NonEmpty b) -> Type) (a6989586621680024374 :: NonEmpty a) = TFHelper_6989586621680024375 a6989586621680024373 a6989586621680024374
type Apply (Traverse_6989586621680995085Sym1 a6989586621680995083 :: TyFun (NonEmpty a) (f (NonEmpty b)) -> Type) (a6989586621680995084 :: NonEmpty a) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type Apply (Traverse_6989586621680995085Sym1 a6989586621680995083 :: TyFun (NonEmpty a) (f (NonEmpty b)) -> Type) (a6989586621680995084 :: NonEmpty a) = Traverse_6989586621680995085 a6989586621680995083 a6989586621680995084
type Apply (LiftA2_6989586621680024392Sym2 a6989586621680024390 a6989586621680024389 :: TyFun (NonEmpty b) (NonEmpty c) -> Type) (a6989586621680024391 :: NonEmpty b) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type Apply (LiftA2_6989586621680024392Sym2 a6989586621680024390 a6989586621680024389 :: TyFun (NonEmpty b) (NonEmpty c) -> Type) (a6989586621680024391 :: NonEmpty b) = LiftA2_6989586621680024392 a6989586621680024390 a6989586621680024389 a6989586621680024391
type Apply (Let6989586621680024535ToListSym3 f6989586621680024534 as6989586621680024533 a6989586621680024532 :: TyFun (NonEmpty k4) [k4] -> Type) (a6989586621680024542 :: NonEmpty k4) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type Apply (Let6989586621680024535ToListSym3 f6989586621680024534 as6989586621680024533 a6989586621680024532 :: TyFun (NonEmpty k4) [k4] -> Type) (a6989586621680024542 :: NonEmpty k4) = Let6989586621680024535ToList f6989586621680024534 as6989586621680024533 a6989586621680024532 a6989586621680024542
type Apply (Compare_6989586621679803314Sym0 :: TyFun (NonEmpty a6989586621679060149) (NonEmpty a6989586621679060149 ~> Ordering) -> Type) (a6989586621679803312 :: NonEmpty a6989586621679060149) 
Instance details

Defined in Data.Singletons.Prelude.Ord

type Apply (Compare_6989586621679803314Sym0 :: TyFun (NonEmpty a6989586621679060149) (NonEmpty a6989586621679060149 ~> Ordering) -> Type) (a6989586621679803312 :: NonEmpty a6989586621679060149) = Compare_6989586621679803314Sym1 a6989586621679803312
type Apply (ShowsPrec_6989586621680595833Sym1 a6989586621680595830 a6989586621679060149 :: TyFun (NonEmpty a6989586621679060149) (Symbol ~> Symbol) -> Type) (a6989586621680595831 :: NonEmpty a6989586621679060149) 
Instance details

Defined in Data.Singletons.Prelude.Show

type Apply (ShowsPrec_6989586621680595833Sym1 a6989586621680595830 a6989586621679060149 :: TyFun (NonEmpty a6989586621679060149) (Symbol ~> Symbol) -> Type) (a6989586621680595831 :: NonEmpty a6989586621679060149) = ShowsPrec_6989586621680595833Sym2 a6989586621680595830 a6989586621680595831
type Apply (TFHelper_6989586621680024526Sym0 :: TyFun (NonEmpty a6989586621679962832) ((a6989586621679962832 ~> NonEmpty b6989586621679962833) ~> NonEmpty b6989586621679962833) -> Type) (a6989586621680024524 :: NonEmpty a6989586621679962832) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type Apply (TFHelper_6989586621680024526Sym0 :: TyFun (NonEmpty a6989586621679962832) ((a6989586621679962832 ~> NonEmpty b6989586621679962833) ~> NonEmpty b6989586621679962833) -> Type) (a6989586621680024524 :: NonEmpty a6989586621679962832) = TFHelper_6989586621680024526Sym1 a6989586621680024524 b6989586621679962833 :: TyFun (a6989586621679962832 ~> NonEmpty b6989586621679962833) (NonEmpty b6989586621679962833) -> Type
type Apply (TFHelper_6989586621680024375Sym0 :: TyFun (NonEmpty (a6989586621679962809 ~> b6989586621679962810)) (NonEmpty a6989586621679962809 ~> NonEmpty b6989586621679962810) -> Type) (a6989586621680024373 :: NonEmpty (a6989586621679962809 ~> b6989586621679962810)) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type Apply (TFHelper_6989586621680024375Sym0 :: TyFun (NonEmpty (a6989586621679962809 ~> b6989586621679962810)) (NonEmpty a6989586621679962809 ~> NonEmpty b6989586621679962810) -> Type) (a6989586621680024373 :: NonEmpty (a6989586621679962809 ~> b6989586621679962810)) = TFHelper_6989586621680024375Sym1 a6989586621680024373
type Apply (Let6989586621680024535Bs'Sym1 a6989586621680024532 :: TyFun [a6989586621679962832] (TyFun (a6989586621679962832 ~> NonEmpty b6989586621679962833) [b6989586621679962833] -> Type) -> Type) (as6989586621680024533 :: [a6989586621679962832]) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type Apply (Let6989586621680024535Bs'Sym1 a6989586621680024532 :: TyFun [a6989586621679962832] (TyFun (a6989586621679962832 ~> NonEmpty b6989586621679962833) [b6989586621679962833] -> Type) -> Type) (as6989586621680024533 :: [a6989586621679962832]) = Let6989586621680024535Bs'Sym2 a6989586621680024532 as6989586621680024533 :: TyFun (a6989586621679962832 ~> NonEmpty b6989586621679962833) [b6989586621679962833] -> Type
type Apply (LiftA2_6989586621680024392Sym1 a6989586621680024389 :: TyFun (NonEmpty a6989586621679962811) (NonEmpty b6989586621679962812 ~> NonEmpty c6989586621679962813) -> Type) (a6989586621680024390 :: NonEmpty a6989586621679962811) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type Apply (LiftA2_6989586621680024392Sym1 a6989586621680024389 :: TyFun (NonEmpty a6989586621679962811) (NonEmpty b6989586621679962812 ~> NonEmpty c6989586621679962813) -> Type) (a6989586621680024390 :: NonEmpty a6989586621679962811) = LiftA2_6989586621680024392Sym2 a6989586621680024389 a6989586621680024390
type Apply (Let6989586621680024535BSym2 as6989586621680024533 a6989586621680024532 :: TyFun (k1 ~> NonEmpty k3) k3 -> Type) (f6989586621680024534 :: k1 ~> NonEmpty k3) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type Apply (Let6989586621680024535BSym2 as6989586621680024533 a6989586621680024532 :: TyFun (k1 ~> NonEmpty k3) k3 -> Type) (f6989586621680024534 :: k1 ~> NonEmpty k3) = Let6989586621680024535B as6989586621680024533 a6989586621680024532 f6989586621680024534
type Apply (TFHelper_6989586621680024526Sym1 a6989586621680024524 b :: TyFun (a ~> NonEmpty b) (NonEmpty b) -> Type) (a6989586621680024525 :: a ~> NonEmpty b) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type Apply (TFHelper_6989586621680024526Sym1 a6989586621680024524 b :: TyFun (a ~> NonEmpty b) (NonEmpty b) -> Type) (a6989586621680024525 :: a ~> NonEmpty b) = TFHelper_6989586621680024526 a6989586621680024524 a6989586621680024525
type Apply (Let6989586621680024535Bs'Sym2 as6989586621680024533 a6989586621680024532 :: TyFun (a6989586621679962832 ~> NonEmpty b6989586621679962833) [b6989586621679962833] -> Type) (f6989586621680024534 :: a6989586621679962832 ~> NonEmpty b6989586621679962833) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type Apply (Let6989586621680024535Bs'Sym2 as6989586621680024533 a6989586621680024532 :: TyFun (a6989586621679962832 ~> NonEmpty b6989586621679962833) [b6989586621679962833] -> Type) (f6989586621680024534 :: a6989586621679962832 ~> NonEmpty b6989586621679962833) = Let6989586621680024535Bs' as6989586621680024533 a6989586621680024532 f6989586621680024534
type Apply (Let6989586621680024535BsSym2 as6989586621680024533 a6989586621680024532 :: TyFun (k1 ~> NonEmpty a) [a] -> Type) (f6989586621680024534 :: k1 ~> NonEmpty a) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type Apply (Let6989586621680024535BsSym2 as6989586621680024533 a6989586621680024532 :: TyFun (k1 ~> NonEmpty a) [a] -> Type) (f6989586621680024534 :: k1 ~> NonEmpty a) = Let6989586621680024535Bs as6989586621680024533 a6989586621680024532 f6989586621680024534
type Apply (Fmap_6989586621680024197Sym0 :: TyFun (a6989586621679962803 ~> b6989586621679962804) (NonEmpty a6989586621679962803 ~> NonEmpty b6989586621679962804) -> Type) (a6989586621680024195 :: a6989586621679962803 ~> b6989586621679962804) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type Apply (Fmap_6989586621680024197Sym0 :: TyFun (a6989586621679962803 ~> b6989586621679962804) (NonEmpty a6989586621679962803 ~> NonEmpty b6989586621679962804) -> Type) (a6989586621680024195 :: a6989586621679962803 ~> b6989586621679962804) = Fmap_6989586621680024197Sym1 a6989586621680024195
type Apply (Traverse_6989586621680995085Sym0 :: TyFun (a6989586621680988964 ~> f6989586621680988963 b6989586621680988965) (NonEmpty a6989586621680988964 ~> f6989586621680988963 (NonEmpty b6989586621680988965)) -> Type) (a6989586621680995083 :: a6989586621680988964 ~> f6989586621680988963 b6989586621680988965) 
Instance details

Defined in Data.Singletons.Prelude.Traversable

type Apply (Traverse_6989586621680995085Sym0 :: TyFun (a6989586621680988964 ~> f6989586621680988963 b6989586621680988965) (NonEmpty a6989586621680988964 ~> f6989586621680988963 (NonEmpty b6989586621680988965)) -> Type) (a6989586621680995083 :: a6989586621680988964 ~> f6989586621680988963 b6989586621680988965) = Traverse_6989586621680995085Sym1 a6989586621680995083
type Apply (LiftA2_6989586621680024392Sym0 :: TyFun (a6989586621679962811 ~> (b6989586621679962812 ~> c6989586621679962813)) (NonEmpty a6989586621679962811 ~> (NonEmpty b6989586621679962812 ~> NonEmpty c6989586621679962813)) -> Type) (a6989586621680024389 :: a6989586621679962811 ~> (b6989586621679962812 ~> c6989586621679962813)) 
Instance details

Defined in Data.Singletons.Prelude.Monad.Internal

type Apply (LiftA2_6989586621680024392Sym0 :: TyFun (a6989586621679962811 ~> (b6989586621679962812 ~> c6989586621679962813)) (NonEmpty a6989586621679962811 ~> (NonEmpty b6989586621679962812 ~> NonEmpty c6989586621679962813)) -> Type) (a6989586621680024389 :: a6989586621679962811 ~> (b6989586621679962812 ~> c6989586621679962813)) = LiftA2_6989586621680024392Sym1 a6989586621680024389

getCallStack :: CallStack -> [([Char], SrcLoc)] #

Extract a list of call-sites from the CallStack.

The list is ordered by most recent call.

Since: base-4.8.1.0

type HasCallStack = ?callStack :: CallStack #

Request a CallStack.

NOTE: The implicit parameter ?callStack :: CallStack is an implementation detail and should not be considered part of the CallStack API, we may decide to change the implementation in the future.

Since: base-4.9.0.0

stimesIdempotentMonoid :: (Integral b, Monoid a) => b -> a -> a #

This is a valid definition of stimes for an idempotent Monoid.

When mappend x x = x, this definition should be preferred, because it works in O(1) rather than O(log n)

data SomeException #

The SomeException type is the root of the exception type hierarchy. When an exception of type e is thrown, behind the scenes it is encapsulated in a SomeException.

Constructors

Exception e => SomeException e 

Instances

Instances details
Show SomeException

Since: base-3.0

Instance details

Defined in GHC.Exception.Type

Exception SomeException

Since: base-3.0

Instance details

Defined in GHC.Exception.Type

data IdentityT (f :: k -> Type) (a :: k) #

The trivial monad transformer, which maps a monad to an equivalent monad.

Instances

Instances details
MonadReader r m => MonadReader r (IdentityT m) 
Instance details

Defined in Control.Monad.Reader.Class

Methods

ask :: IdentityT m r #

local :: (r -> r) -> IdentityT m a -> IdentityT m a #

reader :: (r -> a) -> IdentityT m a #

MonadState s m => MonadState s (IdentityT m) 
Instance details

Defined in Control.Monad.State.Class

Methods

get :: IdentityT m s #

put :: s -> IdentityT m () #

state :: (s -> (a, s)) -> IdentityT m a #

MonadError e m => MonadError e (IdentityT m) 
Instance details

Defined in Control.Monad.Error.Class

Methods

throwError :: e -> IdentityT m a #

catchError :: IdentityT m a -> (e -> IdentityT m a) -> IdentityT m a #

MonadTrans (IdentityT :: (Type -> Type) -> Type -> Type) 
Instance details

Defined in Control.Monad.Trans.Identity

Methods

lift :: Monad m => m a -> IdentityT m a #

Monad m => Monad (IdentityT m) 
Instance details

Defined in Control.Monad.Trans.Identity

Methods

(>>=) :: IdentityT m a -> (a -> IdentityT m b) -> IdentityT m b #

(>>) :: IdentityT m a -> IdentityT m b -> IdentityT m b #

return :: a -> IdentityT m a #

Functor m => Functor (IdentityT m) 
Instance details

Defined in Control.Monad.Trans.Identity

Methods

fmap :: (a -> b) -> IdentityT m a -> IdentityT m b #

(<$) :: a -> IdentityT m b -> IdentityT m a #

MonadFix m => MonadFix (IdentityT m) 
Instance details

Defined in Control.Monad.Trans.Identity

Methods

mfix :: (a -> IdentityT m a) -> IdentityT m a #

MonadFail m => MonadFail (IdentityT m) 
Instance details

Defined in Control.Monad.Trans.Identity

Methods

fail :: String -> IdentityT m a #

Applicative m => Applicative (IdentityT m) 
Instance details

Defined in Control.Monad.Trans.Identity

Methods

pure :: a -> IdentityT m a #

(<*>) :: IdentityT m (a -> b) -> IdentityT m a -> IdentityT m b #

liftA2 :: (a -> b -> c) -> IdentityT m a -> IdentityT m b -> IdentityT m c #

(*>) :: IdentityT m a -> IdentityT m b -> IdentityT m b #

(<*) :: IdentityT m a -> IdentityT m b -> IdentityT m a #

Foldable f => Foldable (IdentityT f) 
Instance details

Defined in Control.Monad.Trans.Identity

Methods

fold :: Monoid m => IdentityT f m -> m #

foldMap :: Monoid m => (a -> m) -> IdentityT f a -> m #

foldMap' :: Monoid m => (a -> m) -> IdentityT f a -> m #

foldr :: (a -> b -> b) -> b -> IdentityT f a -> b #

foldr' :: (a -> b -> b) -> b -> IdentityT f a -> b #

foldl :: (b -> a -> b) -> b -> IdentityT f a -> b #

foldl' :: (b -> a -> b) -> b -> IdentityT f a -> b #

foldr1 :: (a -> a -> a) -> IdentityT f a -> a #

foldl1 :: (a -> a -> a) -> IdentityT f a -> a #

toList :: IdentityT f a -> [a] #

null :: IdentityT f a -> Bool #

length :: IdentityT f a -> Int #

elem :: Eq a => a -> IdentityT f a -> Bool #

maximum :: Ord a => IdentityT f a -> a #

minimum :: Ord a => IdentityT f a -> a #

sum :: Num a => IdentityT f a -> a #

product :: Num a => IdentityT f a -> a #

Traversable f => Traversable (IdentityT f) 
Instance details

Defined in Control.Monad.Trans.Identity

Methods

traverse :: Applicative f0 => (a -> f0 b) -> IdentityT f a -> f0 (IdentityT f b) #

sequenceA :: Applicative f0 => IdentityT f (f0 a) -> f0 (IdentityT f a) #

mapM :: Monad m => (a -> m b) -> IdentityT f a -> m (IdentityT f b) #

sequence :: Monad m => IdentityT f (m a) -> m (IdentityT f a) #

Contravariant f => Contravariant (IdentityT f) 
Instance details

Defined in Control.Monad.Trans.Identity

Methods

contramap :: (a -> b) -> IdentityT f b -> IdentityT f a #

(>$) :: b -> IdentityT f b -> IdentityT f a #

Representable m => Representable (IdentityT m) 
Instance details

Defined in Data.Functor.Rep

Associated Types

type Rep (IdentityT m) #

Methods

tabulate :: (Rep (IdentityT m) -> a) -> IdentityT m a #

index :: IdentityT m a -> Rep (IdentityT m) -> a #

Alternative m => Alternative (IdentityT m) 
Instance details

Defined in Control.Monad.Trans.Identity

Methods

empty :: IdentityT m a #

(<|>) :: IdentityT m a -> IdentityT m a -> IdentityT m a #

some :: IdentityT m a -> IdentityT m [a] #

many :: IdentityT m a -> IdentityT m [a] #

MonadPlus m => MonadPlus (IdentityT m) 
Instance details

Defined in Control.Monad.Trans.Identity

Methods

mzero :: IdentityT m a #

mplus :: IdentityT m a -> IdentityT m a -> IdentityT m a #

Eq1 f => Eq1 (IdentityT f) 
Instance details

Defined in Control.Monad.Trans.Identity

Methods

liftEq :: (a -> b -> Bool) -> IdentityT f a -> IdentityT f b -> Bool #

Ord1 f => Ord1 (IdentityT f) 
Instance details

Defined in Control.Monad.Trans.Identity

Methods

liftCompare :: (a -> b -> Ordering) -> IdentityT f a -> IdentityT f b -> Ordering #

Read1 f => Read1 (IdentityT f) 
Instance details

Defined in Control.Monad.Trans.Identity

Methods

liftReadsPrec :: (Int -> ReadS a) -> ReadS [a] -> Int -> ReadS (IdentityT f a) #

liftReadList :: (Int -> ReadS a) -> ReadS [a] -> ReadS [IdentityT f a] #

liftReadPrec :: ReadPrec a -> ReadPrec [a] -> ReadPrec (IdentityT f a) #

liftReadListPrec :: ReadPrec a -> ReadPrec [a] -> ReadPrec [IdentityT f a] #

Show1 f => Show1 (IdentityT f) 
Instance details

Defined in Control.Monad.Trans.Identity

Methods

liftShowsPrec :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> Int -> IdentityT f a -> ShowS #

liftShowList :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> [IdentityT f a] -> ShowS #

MonadZip m => MonadZip (IdentityT m) 
Instance details

Defined in Control.Monad.Trans.Identity

Methods

mzip :: IdentityT m a -> IdentityT m b -> IdentityT m (a, b) #

mzipWith :: (a -> b -> c) -> IdentityT m a -> IdentityT m b -> IdentityT m c #

munzip :: IdentityT m (a, b) -> (IdentityT m a, IdentityT m b) #

MonadIO m => MonadIO (IdentityT m) 
Instance details

Defined in Control.Monad.Trans.Identity

Methods

liftIO :: IO a -> IdentityT m a #

MonadThrow m => MonadThrow (IdentityT m) 
Instance details

Defined in Control.Monad.Catch

Methods

throwM :: Exception e => e -> IdentityT m a #

MonadCatch m => MonadCatch (IdentityT m) 
Instance details

Defined in Control.Monad.Catch

Methods

catch :: Exception e => IdentityT m a -> (e -> IdentityT m a) -> IdentityT m a #

MonadMask m => MonadMask (IdentityT m) 
Instance details

Defined in Control.Monad.Catch

Methods

mask :: ((forall a. IdentityT m a -> IdentityT m a) -> IdentityT m b) -> IdentityT m b #

uninterruptibleMask :: ((forall a. IdentityT m a -> IdentityT m a) -> IdentityT m b) -> IdentityT m b #

generalBracket :: IdentityT m a -> (a -> ExitCase b -> IdentityT m c) -> (a -> IdentityT m b) -> IdentityT m (b, c) #

PrimMonad m => PrimMonad (IdentityT m) 
Instance details

Defined in Control.Monad.Primitive

Associated Types

type PrimState (IdentityT m) #

Methods

primitive :: (State# (PrimState (IdentityT m)) -> (# State# (PrimState (IdentityT m)), a #)) -> IdentityT m a #

PrimBase m => PrimBase (IdentityT m)

Since: primitive-0.6.2.0

Instance details

Defined in Control.Monad.Primitive

Methods

internal :: IdentityT m a -> State# (PrimState (IdentityT m)) -> (# State# (PrimState (IdentityT m)), a #) #

Zoom m n s t => Zoom (IdentityT m) (IdentityT n) s t 
Instance details

Defined in Control.Lens.Zoom

Methods

zoom :: LensLike' (Zoomed (IdentityT m) c) t s -> IdentityT m c -> IdentityT n c #

Magnify m n b a => Magnify (IdentityT m) (IdentityT n) b a 
Instance details

Defined in Control.Lens.Zoom

Zoom m n s t => Zoom (IdentityT m) (IdentityT n) s t 
Instance details

Defined in Lens.Micro.Mtl.Internal

Methods

zoom :: LensLike' (Zoomed (IdentityT m) c) t s -> IdentityT m c -> IdentityT n c #

Magnify m n b a => Magnify (IdentityT m) (IdentityT n) b a 
Instance details

Defined in Lens.Micro.Mtl.Internal

Methods

magnify :: LensLike' (Magnified (IdentityT m) c) a b -> IdentityT m c -> IdentityT n c #

(Eq1 f, Eq a) => Eq (IdentityT f a) 
Instance details

Defined in Control.Monad.Trans.Identity

Methods

(==) :: IdentityT f a -> IdentityT f a -> Bool #

(/=) :: IdentityT f a -> IdentityT f a -> Bool #

(Ord1 f, Ord a) => Ord (IdentityT f a) 
Instance details

Defined in Control.Monad.Trans.Identity

Methods

compare :: IdentityT f a -> IdentityT f a -> Ordering #

(<) :: IdentityT f a -> IdentityT f a -> Bool #

(<=) :: IdentityT f a -> IdentityT f a -> Bool #

(>) :: IdentityT f a -> IdentityT f a -> Bool #

(>=) :: IdentityT f a -> IdentityT f a -> Bool #

max :: IdentityT f a -> IdentityT f a -> IdentityT f a #

min :: IdentityT f a -> IdentityT f a -> IdentityT f a #

(Read1 f, Read a) => Read (IdentityT f a) 
Instance details

Defined in Control.Monad.Trans.Identity

(Show1 f, Show a) => Show (IdentityT f a) 
Instance details

Defined in Control.Monad.Trans.Identity

Methods

showsPrec :: Int -> IdentityT f a -> ShowS #

show :: IdentityT f a -> String #

showList :: [IdentityT f a] -> ShowS #

Wrapped (IdentityT m a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (IdentityT m a) #

Methods

_Wrapped' :: Iso' (IdentityT m a) (Unwrapped (IdentityT m a)) #

t ~ IdentityT n b => Rewrapped (IdentityT m a) t 
Instance details

Defined in Control.Lens.Wrapped

type Rep (IdentityT m) 
Instance details

Defined in Data.Functor.Rep

type Rep (IdentityT m) = Rep m
type Zoomed (IdentityT m) 
Instance details

Defined in Control.Lens.Zoom

type Zoomed (IdentityT m) = Zoomed m
type Magnified (IdentityT m) 
Instance details

Defined in Control.Lens.Zoom

type Zoomed (IdentityT m) 
Instance details

Defined in Lens.Micro.Mtl.Internal

type Zoomed (IdentityT m) = Zoomed m
type Magnified (IdentityT m) 
Instance details

Defined in Lens.Micro.Mtl.Internal

type PrimState (IdentityT m) 
Instance details

Defined in Control.Monad.Primitive

type Unwrapped (IdentityT m a) 
Instance details

Defined in Control.Lens.Wrapped

type Unwrapped (IdentityT m a) = m a

data IntMap a #

A map of integers to values a.

Instances

Instances details
Functor IntMap 
Instance details

Defined in Data.IntMap.Internal

Methods

fmap :: (a -> b) -> IntMap a -> IntMap b #

(<$) :: a -> IntMap b -> IntMap a #

Foldable IntMap

Folds in order of increasing key.

Instance details

Defined in Data.IntMap.Internal

Methods

fold :: Monoid m => IntMap m -> m #

foldMap :: Monoid m => (a -> m) -> IntMap a -> m #

foldMap' :: Monoid m => (a -> m) -> IntMap a -> m #

foldr :: (a -> b -> b) -> b -> IntMap a -> b #

foldr' :: (a -> b -> b) -> b -> IntMap a -> b #

foldl :: (b -> a -> b) -> b -> IntMap a -> b #

foldl' :: (b -> a -> b) -> b -> IntMap a -> b #

foldr1 :: (a -> a -> a) -> IntMap a -> a #

foldl1 :: (a -> a -> a) -> IntMap a -> a #

toList :: IntMap a -> [a] #

null :: IntMap a -> Bool #

length :: IntMap a -> Int #

elem :: Eq a => a -> IntMap a -> Bool #

maximum :: Ord a => IntMap a -> a #

minimum :: Ord a => IntMap a -> a #

sum :: Num a => IntMap a -> a #

product :: Num a => IntMap a -> a #

Traversable IntMap

Traverses in order of increasing key.

Instance details

Defined in Data.IntMap.Internal

Methods

traverse :: Applicative f => (a -> f b) -> IntMap a -> f (IntMap b) #

sequenceA :: Applicative f => IntMap (f a) -> f (IntMap a) #

mapM :: Monad m => (a -> m b) -> IntMap a -> m (IntMap b) #

sequence :: Monad m => IntMap (m a) -> m (IntMap a) #

Eq1 IntMap

Since: containers-0.5.9

Instance details

Defined in Data.IntMap.Internal

Methods

liftEq :: (a -> b -> Bool) -> IntMap a -> IntMap b -> Bool #

Ord1 IntMap

Since: containers-0.5.9

Instance details

Defined in Data.IntMap.Internal

Methods

liftCompare :: (a -> b -> Ordering) -> IntMap a -> IntMap b -> Ordering #

Read1 IntMap

Since: containers-0.5.9

Instance details

Defined in Data.IntMap.Internal

Methods

liftReadsPrec :: (Int -> ReadS a) -> ReadS [a] -> Int -> ReadS (IntMap a) #

liftReadList :: (Int -> ReadS a) -> ReadS [a] -> ReadS [IntMap a] #

liftReadPrec :: ReadPrec a -> ReadPrec [a] -> ReadPrec (IntMap a) #

liftReadListPrec :: ReadPrec a -> ReadPrec [a] -> ReadPrec [IntMap a] #

Show1 IntMap

Since: containers-0.5.9

Instance details

Defined in Data.IntMap.Internal

Methods

liftShowsPrec :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> Int -> IntMap a -> ShowS #

liftShowList :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> [IntMap a] -> ShowS #

IsList (IntMap a)

Since: containers-0.5.6.2

Instance details

Defined in Data.IntMap.Internal

Associated Types

type Item (IntMap a) #

Methods

fromList :: [Item (IntMap a)] -> IntMap a #

fromListN :: Int -> [Item (IntMap a)] -> IntMap a #

toList :: IntMap a -> [Item (IntMap a)] #

Eq a => Eq (IntMap a) 
Instance details

Defined in Data.IntMap.Internal

Methods

(==) :: IntMap a -> IntMap a -> Bool #

(/=) :: IntMap a -> IntMap a -> Bool #

Data a => Data (IntMap a) 
Instance details

Defined in Data.IntMap.Internal

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> IntMap a -> c (IntMap a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (IntMap a) #

toConstr :: IntMap a -> Constr #

dataTypeOf :: IntMap a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (IntMap a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (IntMap a)) #

gmapT :: (forall b. Data b => b -> b) -> IntMap a -> IntMap a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> IntMap a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> IntMap a -> r #

gmapQ :: (forall d. Data d => d -> u) -> IntMap a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> IntMap a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> IntMap a -> m (IntMap a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> IntMap a -> m (IntMap a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> IntMap a -> m (IntMap a) #

Ord a => Ord (IntMap a) 
Instance details

Defined in Data.IntMap.Internal

Methods

compare :: IntMap a -> IntMap a -> Ordering #

(<) :: IntMap a -> IntMap a -> Bool #

(<=) :: IntMap a -> IntMap a -> Bool #

(>) :: IntMap a -> IntMap a -> Bool #

(>=) :: IntMap a -> IntMap a -> Bool #

max :: IntMap a -> IntMap a -> IntMap a #

min :: IntMap a -> IntMap a -> IntMap a #

Read e => Read (IntMap e) 
Instance details

Defined in Data.IntMap.Internal

Show a => Show (IntMap a) 
Instance details

Defined in Data.IntMap.Internal

Methods

showsPrec :: Int -> IntMap a -> ShowS #

show :: IntMap a -> String #

showList :: [IntMap a] -> ShowS #

Semigroup (IntMap a)

Since: containers-0.5.7

Instance details

Defined in Data.IntMap.Internal

Methods

(<>) :: IntMap a -> IntMap a -> IntMap a #

sconcat :: NonEmpty (IntMap a) -> IntMap a #

stimes :: Integral b => b -> IntMap a -> IntMap 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 #

NFData a => NFData (IntMap a) 
Instance details

Defined in Data.IntMap.Internal

Methods

rnf :: IntMap a -> () #

Ixed (IntMap a) 
Instance details

Defined in Control.Lens.At

Methods

ix :: Index (IntMap a) -> Traversal' (IntMap a) (IxValue (IntMap a)) #

At (IntMap a) 
Instance details

Defined in Control.Lens.At

Methods

at :: Index (IntMap a) -> Lens' (IntMap a) (Maybe (IxValue (IntMap a))) #

Wrapped (IntMap a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (IntMap a) #

Methods

_Wrapped' :: Iso' (IntMap a) (Unwrapped (IntMap a)) #

One (IntMap v) 
Instance details

Defined in Universum.Container.Class

Associated Types

type OneItem (IntMap v) #

Methods

one :: OneItem (IntMap v) -> IntMap v #

Container (IntMap v) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element (IntMap v) #

Methods

toList :: IntMap v -> [Element (IntMap v)] #

null :: IntMap v -> Bool #

foldr :: (Element (IntMap v) -> b -> b) -> b -> IntMap v -> b #

foldl :: (b -> Element (IntMap v) -> b) -> b -> IntMap v -> b #

foldl' :: (b -> Element (IntMap v) -> b) -> b -> IntMap v -> b #

length :: IntMap v -> Int #

elem :: Element (IntMap v) -> IntMap v -> Bool #

maximum :: IntMap v -> Element (IntMap v) #

minimum :: IntMap v -> Element (IntMap v) #

foldMap :: Monoid m => (Element (IntMap v) -> m) -> IntMap v -> m #

fold :: IntMap v -> Element (IntMap v) #

foldr' :: (Element (IntMap v) -> b -> b) -> b -> IntMap v -> b #

foldr1 :: (Element (IntMap v) -> Element (IntMap v) -> Element (IntMap v)) -> IntMap v -> Element (IntMap v) #

foldl1 :: (Element (IntMap v) -> Element (IntMap v) -> Element (IntMap v)) -> IntMap v -> Element (IntMap v) #

notElem :: Element (IntMap v) -> IntMap v -> Bool #

all :: (Element (IntMap v) -> Bool) -> IntMap v -> Bool #

any :: (Element (IntMap v) -> Bool) -> IntMap v -> Bool #

and :: IntMap v -> Bool #

or :: IntMap v -> Bool #

find :: (Element (IntMap v) -> Bool) -> IntMap v -> Maybe (Element (IntMap v)) #

safeHead :: IntMap v -> Maybe (Element (IntMap v)) #

ToPairs (IntMap v) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Key (IntMap v) #

type Val (IntMap v) #

Methods

toPairs :: IntMap v -> [(Key (IntMap v), Val (IntMap v))] #

keys :: IntMap v -> [Key (IntMap v)] #

elems :: IntMap v -> [Val (IntMap v)] #

t ~ IntMap a' => Rewrapped (IntMap a) t

Use wrapping fromList. unwrapping returns a sorted list.

Instance details

Defined in Control.Lens.Wrapped

type Item (IntMap a) 
Instance details

Defined in Data.IntMap.Internal

type Item (IntMap a) = (Key, a)
type Index (IntMap a) 
Instance details

Defined in Control.Lens.At

type Index (IntMap a) = Int
type IxValue (IntMap a) 
Instance details

Defined in Control.Lens.At

type IxValue (IntMap a) = a
type Unwrapped (IntMap a) 
Instance details

Defined in Control.Lens.Wrapped

type Unwrapped (IntMap a) = [(Int, a)]
type OneItem (IntMap v) 
Instance details

Defined in Universum.Container.Class

type OneItem (IntMap v) = (Int, v)
type Element (IntMap v) 
Instance details

Defined in Universum.Container.Class

type Element (IntMap v) = ElementDefault (IntMap v)
type Val (IntMap v) 
Instance details

Defined in Universum.Container.Class

type Val (IntMap v) = v
type Key (IntMap v) 
Instance details

Defined in Universum.Container.Class

type Key (IntMap v) = Int

data IntSet #

A set of integers.

Instances

Instances details
IsList IntSet

Since: containers-0.5.6.2

Instance details

Defined in Data.IntSet.Internal

Associated Types

type Item IntSet #

Eq IntSet 
Instance details

Defined in Data.IntSet.Internal

Methods

(==) :: IntSet -> IntSet -> Bool #

(/=) :: IntSet -> IntSet -> Bool #

Data IntSet 
Instance details

Defined in Data.IntSet.Internal

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> IntSet -> c IntSet #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c IntSet #

toConstr :: IntSet -> Constr #

dataTypeOf :: IntSet -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c IntSet) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c IntSet) #

gmapT :: (forall b. Data b => b -> b) -> IntSet -> IntSet #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> IntSet -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> IntSet -> r #

gmapQ :: (forall d. Data d => d -> u) -> IntSet -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> IntSet -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> IntSet -> m IntSet #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> IntSet -> m IntSet #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> IntSet -> m IntSet #

Ord IntSet 
Instance details

Defined in Data.IntSet.Internal

Read IntSet 
Instance details

Defined in Data.IntSet.Internal

Show IntSet 
Instance details

Defined in Data.IntSet.Internal

Semigroup IntSet

Since: containers-0.5.7

Instance details

Defined in Data.IntSet.Internal

Monoid IntSet 
Instance details

Defined in Data.IntSet.Internal

NFData IntSet 
Instance details

Defined in Data.IntSet.Internal

Methods

rnf :: IntSet -> () #

Contains IntSet 
Instance details

Defined in Control.Lens.At

Ixed IntSet 
Instance details

Defined in Control.Lens.At

At IntSet 
Instance details

Defined in Control.Lens.At

Wrapped IntSet 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped IntSet #

One IntSet 
Instance details

Defined in Universum.Container.Class

Associated Types

type OneItem IntSet #

Methods

one :: OneItem IntSet -> IntSet #

Container IntSet 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element IntSet #

t ~ IntSet => Rewrapped IntSet t

Use wrapping fromList. unwrapping returns a sorted list.

Instance details

Defined in Control.Lens.Wrapped

type Item IntSet 
Instance details

Defined in Data.IntSet.Internal

type Item IntSet = Key
type Index IntSet 
Instance details

Defined in Control.Lens.At

type IxValue IntSet 
Instance details

Defined in Control.Lens.At

type IxValue IntSet = ()
type Unwrapped IntSet 
Instance details

Defined in Control.Lens.Wrapped

type OneItem IntSet 
Instance details

Defined in Universum.Container.Class

type Element IntSet 
Instance details

Defined in Universum.Container.Class

data Seq a #

General-purpose finite sequences.

Instances

Instances details
Monad Seq 
Instance details

Defined in Data.Sequence.Internal

Methods

(>>=) :: Seq a -> (a -> Seq b) -> Seq b #

(>>) :: Seq a -> Seq b -> Seq b #

return :: a -> Seq a #

Functor Seq 
Instance details

Defined in Data.Sequence.Internal

Methods

fmap :: (a -> b) -> Seq a -> Seq b #

(<$) :: a -> Seq b -> Seq a #

MonadFix Seq

Since: containers-0.5.11

Instance details

Defined in Data.Sequence.Internal

Methods

mfix :: (a -> Seq a) -> Seq a #

Applicative Seq

Since: containers-0.5.4

Instance details

Defined in Data.Sequence.Internal

Methods

pure :: a -> Seq a #

(<*>) :: Seq (a -> b) -> Seq a -> Seq b #

liftA2 :: (a -> b -> c) -> Seq a -> Seq b -> Seq c #

(*>) :: Seq a -> Seq b -> Seq b #

(<*) :: Seq a -> Seq b -> Seq a #

Foldable Seq 
Instance details

Defined in Data.Sequence.Internal

Methods

fold :: Monoid m => Seq m -> m #

foldMap :: Monoid m => (a -> m) -> Seq a -> m #

foldMap' :: Monoid m => (a -> m) -> Seq a -> m #

foldr :: (a -> b -> b) -> b -> Seq a -> b #

foldr' :: (a -> b -> b) -> b -> Seq a -> b #

foldl :: (b -> a -> b) -> b -> Seq a -> b #

foldl' :: (b -> a -> b) -> b -> Seq a -> b #

foldr1 :: (a -> a -> a) -> Seq a -> a #

foldl1 :: (a -> a -> a) -> Seq a -> a #

toList :: Seq a -> [a] #

null :: Seq a -> Bool #

length :: Seq a -> Int #

elem :: Eq a => a -> Seq a -> Bool #

maximum :: Ord a => Seq a -> a #

minimum :: Ord a => Seq a -> a #

sum :: Num a => Seq a -> a #

product :: Num a => Seq a -> a #

Traversable Seq 
Instance details

Defined in Data.Sequence.Internal

Methods

traverse :: Applicative f => (a -> f b) -> Seq a -> f (Seq b) #

sequenceA :: Applicative f => Seq (f a) -> f (Seq a) #

mapM :: Monad m => (a -> m b) -> Seq a -> m (Seq b) #

sequence :: Monad m => Seq (m a) -> m (Seq a) #

Alternative Seq

Since: containers-0.5.4

Instance details

Defined in Data.Sequence.Internal

Methods

empty :: Seq a #

(<|>) :: Seq a -> Seq a -> Seq a #

some :: Seq a -> Seq [a] #

many :: Seq a -> Seq [a] #

MonadPlus Seq 
Instance details

Defined in Data.Sequence.Internal

Methods

mzero :: Seq a #

mplus :: Seq a -> Seq a -> Seq a #

Eq1 Seq

Since: containers-0.5.9

Instance details

Defined in Data.Sequence.Internal

Methods

liftEq :: (a -> b -> Bool) -> Seq a -> Seq b -> Bool #

Ord1 Seq

Since: containers-0.5.9

Instance details

Defined in Data.Sequence.Internal

Methods

liftCompare :: (a -> b -> Ordering) -> Seq a -> Seq b -> Ordering #

Read1 Seq

Since: containers-0.5.9

Instance details

Defined in Data.Sequence.Internal

Methods

liftReadsPrec :: (Int -> ReadS a) -> ReadS [a] -> Int -> ReadS (Seq a) #

liftReadList :: (Int -> ReadS a) -> ReadS [a] -> ReadS [Seq a] #

liftReadPrec :: ReadPrec a -> ReadPrec [a] -> ReadPrec (Seq a) #

liftReadListPrec :: ReadPrec a -> ReadPrec [a] -> ReadPrec [Seq a] #

Show1 Seq

Since: containers-0.5.9

Instance details

Defined in Data.Sequence.Internal

Methods

liftShowsPrec :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> Int -> Seq a -> ShowS #

liftShowList :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> [Seq a] -> ShowS #

MonadZip Seq
 mzipWith = zipWith
 munzip = unzip
Instance details

Defined in Data.Sequence.Internal

Methods

mzip :: Seq a -> Seq b -> Seq (a, b) #

mzipWith :: (a -> b -> c) -> Seq a -> Seq b -> Seq c #

munzip :: Seq (a, b) -> (Seq a, Seq b) #

UnzipWith Seq 
Instance details

Defined in Data.Sequence.Internal

Methods

unzipWith' :: (x -> (a, b)) -> Seq x -> (Seq a, Seq b)

IsList (Seq a) 
Instance details

Defined in Data.Sequence.Internal

Associated Types

type Item (Seq a) #

Methods

fromList :: [Item (Seq a)] -> Seq a #

fromListN :: Int -> [Item (Seq a)] -> Seq a #

toList :: Seq a -> [Item (Seq a)] #

Eq a => Eq (Seq a) 
Instance details

Defined in Data.Sequence.Internal

Methods

(==) :: Seq a -> Seq a -> Bool #

(/=) :: Seq a -> Seq a -> Bool #

Data a => Data (Seq a) 
Instance details

Defined in Data.Sequence.Internal

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Seq a -> c (Seq a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Seq a) #

toConstr :: Seq a -> Constr #

dataTypeOf :: Seq a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Seq a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Seq a)) #

gmapT :: (forall b. Data b => b -> b) -> Seq a -> Seq a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Seq a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Seq a -> r #

gmapQ :: (forall d. Data d => d -> u) -> Seq a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Seq a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Seq a -> m (Seq a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Seq a -> m (Seq a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Seq a -> m (Seq a) #

Ord a => Ord (Seq a) 
Instance details

Defined in Data.Sequence.Internal

Methods

compare :: Seq a -> Seq a -> Ordering #

(<) :: Seq a -> Seq a -> Bool #

(<=) :: Seq a -> Seq a -> Bool #

(>) :: Seq a -> Seq a -> Bool #

(>=) :: Seq a -> Seq a -> Bool #

max :: Seq a -> Seq a -> Seq a #

min :: Seq a -> Seq a -> Seq a #

Read a => Read (Seq a) 
Instance details

Defined in Data.Sequence.Internal

Show a => Show (Seq a) 
Instance details

Defined in Data.Sequence.Internal

Methods

showsPrec :: Int -> Seq a -> ShowS #

show :: Seq a -> String #

showList :: [Seq a] -> ShowS #

a ~ Char => IsString (Seq a)

Since: containers-0.5.7

Instance details

Defined in Data.Sequence.Internal

Methods

fromString :: String -> Seq a #

Semigroup (Seq a)

Since: containers-0.5.7

Instance details

Defined in Data.Sequence.Internal

Methods

(<>) :: Seq a -> Seq a -> Seq a #

sconcat :: NonEmpty (Seq a) -> Seq a #

stimes :: Integral b => b -> Seq a -> Seq 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 #

NFData a => NFData (Seq a) 
Instance details

Defined in Data.Sequence.Internal

Methods

rnf :: Seq a -> () #

Ixed (Seq a) 
Instance details

Defined in Control.Lens.At

Methods

ix :: Index (Seq a) -> Traversal' (Seq a) (IxValue (Seq a)) #

Wrapped (Seq a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (Seq a) #

Methods

_Wrapped' :: Iso' (Seq a) (Unwrapped (Seq a)) #

One (Seq a) 
Instance details

Defined in Universum.Container.Class

Associated Types

type OneItem (Seq a) #

Methods

one :: OneItem (Seq a) -> Seq a #

Container (Seq a) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element (Seq a) #

Methods

toList :: Seq a -> [Element (Seq a)] #

null :: Seq a -> Bool #

foldr :: (Element (Seq a) -> b -> b) -> b -> Seq a -> b #

foldl :: (b -> Element (Seq a) -> b) -> b -> Seq a -> b #

foldl' :: (b -> Element (Seq a) -> b) -> b -> Seq a -> b #

length :: Seq a -> Int #

elem :: Element (Seq a) -> Seq a -> Bool #

maximum :: Seq a -> Element (Seq a) #

minimum :: Seq a -> Element (Seq a) #

foldMap :: Monoid m => (Element (Seq a) -> m) -> Seq a -> m #

fold :: Seq a -> Element (Seq a) #

foldr' :: (Element (Seq a) -> b -> b) -> b -> Seq a -> b #

foldr1 :: (Element (Seq a) -> Element (Seq a) -> Element (Seq a)) -> Seq a -> Element (Seq a) #

foldl1 :: (Element (Seq a) -> Element (Seq a) -> Element (Seq a)) -> Seq a -> Element (Seq a) #

notElem :: Element (Seq a) -> Seq a -> Bool #

all :: (Element (Seq a) -> Bool) -> Seq a -> Bool #

any :: (Element (Seq a) -> Bool) -> Seq a -> Bool #

and :: Seq a -> Bool #

or :: Seq a -> Bool #

find :: (Element (Seq a) -> Bool) -> Seq a -> Maybe (Element (Seq a)) #

safeHead :: Seq a -> Maybe (Element (Seq a)) #

t ~ Seq a' => Rewrapped (Seq a) t 
Instance details

Defined in Control.Lens.Wrapped

type Item (Seq a) 
Instance details

Defined in Data.Sequence.Internal

type Item (Seq a) = a
type Index (Seq a) 
Instance details

Defined in Control.Lens.At

type Index (Seq a) = Int
type IxValue (Seq a) 
Instance details

Defined in Control.Lens.At

type IxValue (Seq a) = a
type Unwrapped (Seq a) 
Instance details

Defined in Control.Lens.Wrapped

type Unwrapped (Seq a) = [a]
type OneItem (Seq a) 
Instance details

Defined in Universum.Container.Class

type OneItem (Seq a) = a
type Element (Seq a) 
Instance details

Defined in Universum.Container.Class

type Element (Seq a) = ElementDefault (Seq a)

data Set a #

A set of values a.

Instances

Instances details
Foldable Set

Folds in order of increasing key.

Instance details

Defined in Data.Set.Internal

Methods

fold :: Monoid m => Set m -> m #

foldMap :: Monoid m => (a -> m) -> Set a -> m #

foldMap' :: Monoid m => (a -> m) -> Set a -> m #

foldr :: (a -> b -> b) -> b -> Set a -> b #

foldr' :: (a -> b -> b) -> b -> Set a -> b #

foldl :: (b -> a -> b) -> b -> Set a -> b #

foldl' :: (b -> a -> b) -> b -> Set a -> b #

foldr1 :: (a -> a -> a) -> Set a -> a #

foldl1 :: (a -> a -> a) -> Set a -> a #

toList :: Set a -> [a] #

null :: Set a -> Bool #

length :: Set a -> Int #

elem :: Eq a => a -> Set a -> Bool #

maximum :: Ord a => Set a -> a #

minimum :: Ord a => Set a -> a #

sum :: Num a => Set a -> a #

product :: Num a => Set a -> a #

Eq1 Set

Since: containers-0.5.9

Instance details

Defined in Data.Set.Internal

Methods

liftEq :: (a -> b -> Bool) -> Set a -> Set b -> Bool #

Ord1 Set

Since: containers-0.5.9

Instance details

Defined in Data.Set.Internal

Methods

liftCompare :: (a -> b -> Ordering) -> Set a -> Set b -> Ordering #

Show1 Set

Since: containers-0.5.9

Instance details

Defined in Data.Set.Internal

Methods

liftShowsPrec :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> Int -> Set a -> ShowS #

liftShowList :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> [Set a] -> ShowS #

Ord a => IsList (Set a)

Since: containers-0.5.6.2

Instance details

Defined in Data.Set.Internal

Associated Types

type Item (Set a) #

Methods

fromList :: [Item (Set a)] -> Set a #

fromListN :: Int -> [Item (Set a)] -> Set a #

toList :: Set a -> [Item (Set a)] #

Eq a => Eq (Set a) 
Instance details

Defined in Data.Set.Internal

Methods

(==) :: Set a -> Set a -> Bool #

(/=) :: Set a -> Set a -> Bool #

(Data a, Ord a) => Data (Set a) 
Instance details

Defined in Data.Set.Internal

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Set a -> c (Set a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Set a) #

toConstr :: Set a -> Constr #

dataTypeOf :: Set a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Set a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Set a)) #

gmapT :: (forall b. Data b => b -> b) -> Set a -> Set a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Set a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Set a -> r #

gmapQ :: (forall d. Data d => d -> u) -> Set a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Set a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Set a -> m (Set a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Set a -> m (Set a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Set a -> m (Set a) #

Ord a => Ord (Set a) 
Instance details

Defined in Data.Set.Internal

Methods

compare :: Set a -> Set a -> Ordering #

(<) :: Set a -> Set a -> Bool #

(<=) :: Set a -> Set a -> Bool #

(>) :: Set a -> Set a -> Bool #

(>=) :: Set a -> Set a -> Bool #

max :: Set a -> Set a -> Set a #

min :: Set a -> Set a -> Set a #

(Read a, Ord a) => Read (Set a) 
Instance details

Defined in Data.Set.Internal

Show a => Show (Set a) 
Instance details

Defined in Data.Set.Internal

Methods

showsPrec :: Int -> Set a -> ShowS #

show :: Set a -> String #

showList :: [Set a] -> ShowS #

Ord a => Semigroup (Set a)

Since: containers-0.5.7

Instance details

Defined in Data.Set.Internal

Methods

(<>) :: Set a -> Set a -> Set a #

sconcat :: NonEmpty (Set a) -> Set a #

stimes :: Integral b => b -> Set a -> Set 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 #

NFData a => NFData (Set a) 
Instance details

Defined in Data.Set.Internal

Methods

rnf :: Set a -> () #

Ord a => Contains (Set a) 
Instance details

Defined in Control.Lens.At

Methods

contains :: Index (Set a) -> Lens' (Set a) Bool #

Ord k => Ixed (Set k) 
Instance details

Defined in Control.Lens.At

Methods

ix :: Index (Set k) -> Traversal' (Set k) (IxValue (Set k)) #

Ord k => At (Set k) 
Instance details

Defined in Control.Lens.At

Methods

at :: Index (Set k) -> Lens' (Set k) (Maybe (IxValue (Set k))) #

Ord a => Wrapped (Set a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (Set a) #

Methods

_Wrapped' :: Iso' (Set a) (Unwrapped (Set a)) #

NiceComparable e => MemOpHs (Set e) 
Instance details

Defined in Lorentz.Polymorphic

Associated Types

type MemOpKeyHs (Set e) #

NiceComparable e => IterOpHs (Set e) 
Instance details

Defined in Lorentz.Polymorphic

Associated Types

type IterOpElHs (Set e) #

SizeOpHs (Set a) 
Instance details

Defined in Lorentz.Polymorphic

NiceComparable a => UpdOpHs (Set a) 
Instance details

Defined in Lorentz.Polymorphic

Associated Types

type UpdOpKeyHs (Set a) #

type UpdOpParamsHs (Set a) #

KnownIsoT v => HasAnnotation (Set v) 
Instance details

Defined in Lorentz.Annotation

Methods

getAnnotation :: Notes (ToT (Set v)) #

(Comparable (ToT c), Ord c, IsoValue c) => IsoValue (Set c) 
Instance details

Defined in Michelson.Typed.Haskell.Value

Associated Types

type ToT (Set c) :: T #

Methods

toVal :: Set c -> Value (ToT (Set c)) #

fromVal :: Value (ToT (Set c)) -> Set c #

PolyCTypeHasDocC '[a] => TypeHasDoc (Set a) 
Instance details

Defined in Michelson.Typed.Haskell.Doc

Associated Types

type TypeDocFieldDescriptions (Set a) :: FieldDescriptions #

One (Set v) 
Instance details

Defined in Universum.Container.Class

Associated Types

type OneItem (Set v) #

Methods

one :: OneItem (Set v) -> Set v #

Ord v => Container (Set v) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element (Set v) #

Methods

toList :: Set v -> [Element (Set v)] #

null :: Set v -> Bool #

foldr :: (Element (Set v) -> b -> b) -> b -> Set v -> b #

foldl :: (b -> Element (Set v) -> b) -> b -> Set v -> b #

foldl' :: (b -> Element (Set v) -> b) -> b -> Set v -> b #

length :: Set v -> Int #

elem :: Element (Set v) -> Set v -> Bool #

maximum :: Set v -> Element (Set v) #

minimum :: Set v -> Element (Set v) #

foldMap :: Monoid m => (Element (Set v) -> m) -> Set v -> m #

fold :: Set v -> Element (Set v) #

foldr' :: (Element (Set v) -> b -> b) -> b -> Set v -> b #

foldr1 :: (Element (Set v) -> Element (Set v) -> Element (Set v)) -> Set v -> Element (Set v) #

foldl1 :: (Element (Set v) -> Element (Set v) -> Element (Set v)) -> Set v -> Element (Set v) #

notElem :: Element (Set v) -> Set v -> Bool #

all :: (Element (Set v) -> Bool) -> Set v -> Bool #

any :: (Element (Set v) -> Bool) -> Set v -> Bool #

and :: Set v -> Bool #

or :: Set v -> Bool #

find :: (Element (Set v) -> Bool) -> Set v -> Maybe (Element (Set v)) #

safeHead :: Set v -> Maybe (Element (Set v)) #

(t ~ Set a', Ord a) => Rewrapped (Set a) t

Use wrapping fromList. unwrapping returns a sorted list.

Instance details

Defined in Control.Lens.Wrapped

CanCastTo k1 k2 => CanCastTo (Set k1 :: Type) (Set k2 :: Type) 
Instance details

Defined in Lorentz.Coercions

Methods

castDummy :: Proxy (Set k1) -> Proxy (Set k2) -> () #

type Item (Set a) 
Instance details

Defined in Data.Set.Internal

type Item (Set a) = a
type Index (Set a) 
Instance details

Defined in Control.Lens.At

type Index (Set a) = a
type IxValue (Set k) 
Instance details

Defined in Control.Lens.At

type IxValue (Set k) = ()
type Unwrapped (Set a) 
Instance details

Defined in Control.Lens.Wrapped

type Unwrapped (Set a) = [a]
type MemOpKeyHs (Set e) 
Instance details

Defined in Lorentz.Polymorphic

type MemOpKeyHs (Set e) = e
type IterOpElHs (Set e) 
Instance details

Defined in Lorentz.Polymorphic

type IterOpElHs (Set e) = e
type UpdOpParamsHs (Set a) 
Instance details

Defined in Lorentz.Polymorphic

type UpdOpKeyHs (Set a) 
Instance details

Defined in Lorentz.Polymorphic

type UpdOpKeyHs (Set a) = a
type ToT (Set c) 
Instance details

Defined in Michelson.Typed.Haskell.Value

type ToT (Set c) = 'TSet (ToT c)
type TypeDocFieldDescriptions (Set a) 
Instance details

Defined in Michelson.Typed.Haskell.Doc

type OneItem (Set v) 
Instance details

Defined in Universum.Container.Class

type OneItem (Set v) = v
type Element (Set v) 
Instance details

Defined in Universum.Container.Class

type Element (Set v) = ElementDefault (Set v)

class NFData a where #

A class of types that can be fully evaluated.

Since: deepseq-1.1.0.0

Minimal complete definition

Nothing

Methods

rnf :: a -> () #

rnf should reduce its argument to normal form (that is, fully evaluate all sub-components), and then return ().

Generic NFData deriving

Starting with GHC 7.2, you can automatically derive instances for types possessing a Generic instance.

Note: Generic1 can be auto-derived starting with GHC 7.4

{-# LANGUAGE DeriveGeneric #-}

import GHC.Generics (Generic, Generic1)
import Control.DeepSeq

data Foo a = Foo a String
             deriving (Eq, Generic, Generic1)

instance NFData a => NFData (Foo a)
instance NFData1 Foo

data Colour = Red | Green | Blue
              deriving Generic

instance NFData Colour

Starting with GHC 7.10, the example above can be written more concisely by enabling the new DeriveAnyClass extension:

{-# LANGUAGE DeriveGeneric, DeriveAnyClass #-}

import GHC.Generics (Generic)
import Control.DeepSeq

data Foo a = Foo a String
             deriving (Eq, Generic, Generic1, NFData, NFData1)

data Colour = Red | Green | Blue
              deriving (Generic, NFData)

Compatibility with previous deepseq versions

Prior to version 1.4.0.0, the default implementation of the rnf method was defined as

rnf a = seq a ()

However, starting with deepseq-1.4.0.0, the default implementation is based on DefaultSignatures allowing for more accurate auto-derived NFData instances. If you need the previously used exact default rnf method implementation semantics, use

instance NFData Colour where rnf x = seq x ()

or alternatively

instance NFData Colour where rnf = rwhnf

or

{-# LANGUAGE BangPatterns #-}
instance NFData Colour where rnf !_ = ()

Instances

Instances details
NFData Bool 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Bool -> () #

NFData Char 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Char -> () #

NFData Double 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Double -> () #

NFData Float 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Float -> () #

NFData Int 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Int -> () #

NFData Int8 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Int8 -> () #

NFData Int16 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Int16 -> () #

NFData Int32 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Int32 -> () #

NFData Int64 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Int64 -> () #

NFData Integer 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Integer -> () #

NFData Natural

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Natural -> () #

NFData Ordering 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Ordering -> () #

NFData Word 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Word -> () #

NFData Word8 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Word8 -> () #

NFData Word16 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Word16 -> () #

NFData Word32 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Word32 -> () #

NFData Word64 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Word64 -> () #

NFData CallStack

Since: deepseq-1.4.2.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CallStack -> () #

NFData () 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: () -> () #

NFData TyCon

NOTE: Prior to deepseq-1.4.4.0 this instance was only defined for base-4.8.0.0 and later.

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: TyCon -> () #

NFData Version

Since: deepseq-1.3.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Version -> () #

NFData ByteString 
Instance details

Defined in Data.ByteString.Internal

Methods

rnf :: ByteString -> () #

NFData ByteString 
Instance details

Defined in Data.ByteString.Lazy.Internal

Methods

rnf :: ByteString -> () #

NFData Scientific 
Instance details

Defined in Data.Scientific

Methods

rnf :: Scientific -> () #

NFData UTCTime 
Instance details

Defined in Data.Time.Clock.Internal.UTCTime

Methods

rnf :: UTCTime -> () #

NFData JSONPathElement 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

rnf :: JSONPathElement -> () #

NFData Value 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

rnf :: Value -> () #

NFData Void

Defined as rnf = absurd.

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Void -> () #

NFData Unique

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Unique -> () #

NFData ThreadId

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: ThreadId -> () #

NFData ExitCode

Since: deepseq-1.4.2.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: ExitCode -> () #

NFData MaskingState

Since: deepseq-1.4.4.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: MaskingState -> () #

NFData TypeRep

NOTE: Prior to deepseq-1.4.4.0 this instance was only defined for base-4.8.0.0 and later.

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: TypeRep -> () #

NFData All

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: All -> () #

NFData Any

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Any -> () #

NFData CChar

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CChar -> () #

NFData CSChar

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CSChar -> () #

NFData CUChar

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CUChar -> () #

NFData CShort

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CShort -> () #

NFData CUShort

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CUShort -> () #

NFData CInt

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CInt -> () #

NFData CUInt

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CUInt -> () #

NFData CLong

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CLong -> () #

NFData CULong

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CULong -> () #

NFData CLLong

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CLLong -> () #

NFData CULLong

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CULLong -> () #

NFData CBool

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CBool -> () #

NFData CFloat

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CFloat -> () #

NFData CDouble

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CDouble -> () #

NFData CPtrdiff

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CPtrdiff -> () #

NFData CSize

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CSize -> () #

NFData CWchar

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CWchar -> () #

NFData CSigAtomic

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CSigAtomic -> () #

NFData CClock

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CClock -> () #

NFData CTime

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CTime -> () #

NFData CUSeconds

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CUSeconds -> () #

NFData CSUSeconds

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CSUSeconds -> () #

NFData CFile

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CFile -> () #

NFData CFpos

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CFpos -> () #

NFData CJmpBuf

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CJmpBuf -> () #

NFData CIntPtr

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CIntPtr -> () #

NFData CUIntPtr

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CUIntPtr -> () #

NFData CIntMax

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CIntMax -> () #

NFData CUIntMax

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: CUIntMax -> () #

NFData Fingerprint

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Fingerprint -> () #

NFData SrcLoc

Since: deepseq-1.4.2.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: SrcLoc -> () #

NFData IntSet 
Instance details

Defined in Data.IntSet.Internal

Methods

rnf :: IntSet -> () #

NFData SecretKey 
Instance details

Defined in Crypto.PubKey.Ed25519

Methods

rnf :: SecretKey -> () #

NFData PublicKey 
Instance details

Defined in Crypto.PubKey.Ed25519

Methods

rnf :: PublicKey -> () #

NFData Signature 
Instance details

Defined in Crypto.PubKey.Ed25519

Methods

rnf :: Signature -> () #

NFData T 
Instance details

Defined in Michelson.Typed.T

Methods

rnf :: T -> () #

NFData EpName 
Instance details

Defined in Michelson.Untyped.EntryPoints

Methods

rnf :: EpName -> () #

NFData MText 
Instance details

Defined in Michelson.Text

Methods

rnf :: MText -> () #

NFData KeyHash 
Instance details

Defined in Tezos.Crypto

Methods

rnf :: KeyHash -> () #

NFData Signature 
Instance details

Defined in Tezos.Crypto

Methods

rnf :: Signature -> () #

NFData PublicKey 
Instance details

Defined in Tezos.Crypto

Methods

rnf :: PublicKey -> () #

NFData ChainId 
Instance details

Defined in Tezos.Core

Methods

rnf :: ChainId -> () #

NFData Timestamp 
Instance details

Defined in Tezos.Core

Methods

rnf :: Timestamp -> () #

NFData Mutez 
Instance details

Defined in Tezos.Core

Methods

rnf :: Mutez -> () #

NFData Address 
Instance details

Defined in Tezos.Address

Methods

rnf :: Address -> () #

NFData EpAddress 
Instance details

Defined in Michelson.Typed.EntryPoints

Methods

rnf :: EpAddress -> () #

NFData SomeDocItem 
Instance details

Defined in Michelson.Doc

Methods

rnf :: SomeDocItem -> () #

NFData Pos 
Instance details

Defined in Text.Megaparsec.Pos

Methods

rnf :: Pos -> () #

NFData InvalidPosException 
Instance details

Defined in Text.Megaparsec.Pos

Methods

rnf :: InvalidPosException -> () #

NFData SourcePos 
Instance details

Defined in Text.Megaparsec.Pos

Methods

rnf :: SourcePos -> () #

NFData MichelsonFailed 
Instance details

Defined in Michelson.Interpret

Methods

rnf :: MichelsonFailed -> () #

NFData MorleyLogs 
Instance details

Defined in Michelson.Interpret

Methods

rnf :: MorleyLogs -> () #

NFData RemainingSteps 
Instance details

Defined in Michelson.Interpret

Methods

rnf :: RemainingSteps -> () #

NFData InterpreterState 
Instance details

Defined in Michelson.Interpret

Methods

rnf :: InterpreterState -> () #

NFData LetMacro 
Instance details

Defined in Michelson.Macro

Methods

rnf :: LetMacro -> () #

NFData PairStruct 
Instance details

Defined in Michelson.Macro

Methods

rnf :: PairStruct -> () #

NFData UnpairStruct 
Instance details

Defined in Michelson.Macro

Methods

rnf :: UnpairStruct -> () #

NFData CadrStruct 
Instance details

Defined in Michelson.Macro

Methods

rnf :: CadrStruct -> () #

NFData ParsedOp 
Instance details

Defined in Michelson.Macro

Methods

rnf :: ParsedOp -> () #

NFData Macro 
Instance details

Defined in Michelson.Macro

Methods

rnf :: Macro -> () #

NFData ExpectType 
Instance details

Defined in Michelson.TypeCheck.Error

Methods

rnf :: ExpectType -> () #

NFData TypeContext 
Instance details

Defined in Michelson.TypeCheck.Error

Methods

rnf :: TypeContext -> () #

NFData TCTypeError 
Instance details

Defined in Michelson.TypeCheck.Error

Methods

rnf :: TCTypeError -> () #

NFData TCError 
Instance details

Defined in Michelson.TypeCheck.Error

Methods

rnf :: TCError -> () #

NFData StackSize 
Instance details

Defined in Michelson.TypeCheck.Error

Methods

rnf :: StackSize -> () #

NFData ExtError 
Instance details

Defined in Michelson.TypeCheck.Error

Methods

rnf :: ExtError -> () #

NFData SomeHST 
Instance details

Defined in Michelson.TypeCheck.Types

Methods

rnf :: SomeHST -> () #

NFData SomeContract 
Instance details

Defined in Michelson.TypeCheck.Types

Methods

rnf :: SomeContract -> () #

NFData CommentType 
Instance details

Defined in Michelson.Typed.Instr

Methods

rnf :: CommentType -> () #

NFData ArithErrorType 
Instance details

Defined in Michelson.Typed.Arith

Methods

rnf :: ArithErrorType -> () #

NFData SetDelegate 
Instance details

Defined in Michelson.Typed.Value

Methods

rnf :: SetDelegate -> () #

NFData ParseEpAddressError 
Instance details

Defined in Michelson.Typed.EntryPoints

Methods

rnf :: ParseEpAddressError -> () #

NFData ArmCoord 
Instance details

Defined in Michelson.Typed.EntryPoints

Methods

rnf :: ArmCoord -> () #

NFData ParamEpError 
Instance details

Defined in Michelson.Typed.EntryPoints

Methods

rnf :: ParamEpError -> () #

NFData AnnConvergeError 
Instance details

Defined in Michelson.Typed.Annotation

Methods

rnf :: AnnConvergeError -> () #

NFData ExpandedOp 
Instance details

Defined in Michelson.Untyped.Instr

Methods

rnf :: ExpandedOp -> () #

NFData GlobalCounter 
Instance details

Defined in Michelson.Untyped.Instr

Methods

rnf :: GlobalCounter -> () #

NFData InternalByteString 
Instance details

Defined in Michelson.Untyped.Value

Methods

rnf :: InternalByteString -> () #

NFData ContractHash 
Instance details

Defined in Tezos.Address

Methods

rnf :: ContractHash -> () #

NFData OperationHash 
Instance details

Defined in Tezos.Address

Methods

rnf :: OperationHash -> () #

NFData OriginationIndex 
Instance details

Defined in Tezos.Address

Methods

rnf :: OriginationIndex -> () #

NFData ParseAddressError 
Instance details

Defined in Tezos.Address

Methods

rnf :: ParseAddressError -> () #

NFData ParseAddressRawError 
Instance details

Defined in Tezos.Address

Methods

rnf :: ParseAddressRawError -> () #

NFData ParseContractAddressError 
Instance details

Defined in Tezos.Address

NFData SecretKey 
Instance details

Defined in Tezos.Crypto

Methods

rnf :: SecretKey -> () #

NFData KeyHashTag 
Instance details

Defined in Tezos.Crypto

Methods

rnf :: KeyHashTag -> () #

NFData PublicKey 
Instance details

Defined in Tezos.Crypto.Ed25519

Methods

rnf :: PublicKey -> () #

NFData SecretKey 
Instance details

Defined in Tezos.Crypto.Ed25519

Methods

rnf :: SecretKey -> () #

NFData Signature 
Instance details

Defined in Tezos.Crypto.Ed25519

Methods

rnf :: Signature -> () #

NFData PublicKey 
Instance details

Defined in Tezos.Crypto.P256

Methods

rnf :: PublicKey -> () #

NFData SecretKey 
Instance details

Defined in Tezos.Crypto.P256

Methods

rnf :: SecretKey -> () #

NFData Signature 
Instance details

Defined in Tezos.Crypto.P256

Methods

rnf :: Signature -> () #

NFData PublicKey 
Instance details

Defined in Tezos.Crypto.Secp256k1

Methods

rnf :: PublicKey -> () #

NFData SecretKey 
Instance details

Defined in Tezos.Crypto.Secp256k1

Methods

rnf :: SecretKey -> () #

NFData Signature 
Instance details

Defined in Tezos.Crypto.Secp256k1

Methods

rnf :: Signature -> () #

NFData CustomParserException 
Instance details

Defined in Michelson.Parser.Error

Methods

rnf :: CustomParserException -> () #

NFData StringLiteralParserException 
Instance details

Defined in Michelson.Parser.Error

NFData EpNameFromRefAnnError 
Instance details

Defined in Michelson.Untyped.EntryPoints

Methods

rnf :: EpNameFromRefAnnError -> () #

NFData Positive 
Instance details

Defined in Util.Positive

Methods

rnf :: Positive -> () #

NFData Pos 
Instance details

Defined in Michelson.ErrorPos

Methods

rnf :: Pos -> () #

NFData SrcPos 
Instance details

Defined in Michelson.ErrorPos

Methods

rnf :: SrcPos -> () #

NFData LetName 
Instance details

Defined in Michelson.ErrorPos

Methods

rnf :: LetName -> () #

NFData InstrCallStack 
Instance details

Defined in Michelson.ErrorPos

Methods

rnf :: InstrCallStack -> () #

NFData BadTypeForScope 
Instance details

Defined in Michelson.Typed.Scope

Methods

rnf :: BadTypeForScope -> () #

NFData EntriesOrder 
Instance details

Defined in Michelson.Untyped.Contract

Methods

rnf :: EntriesOrder -> () #

NFData StackRef 
Instance details

Defined in Michelson.Untyped.Ext

Methods

rnf :: StackRef -> () #

NFData Var 
Instance details

Defined in Michelson.Untyped.Ext

Methods

rnf :: Var -> () #

NFData TyVar 
Instance details

Defined in Michelson.Untyped.Ext

Methods

rnf :: TyVar -> () #

NFData StackTypePattern 
Instance details

Defined in Michelson.Untyped.Ext

Methods

rnf :: StackTypePattern -> () #

NFData StackFn 
Instance details

Defined in Michelson.Untyped.Ext

Methods

rnf :: StackFn -> () #

NFData PrintComment 
Instance details

Defined in Michelson.Untyped.Ext

Methods

rnf :: PrintComment -> () #

NFData Type 
Instance details

Defined in Michelson.Untyped.Type

Methods

rnf :: Type -> () #

NFData ParameterType 
Instance details

Defined in Michelson.Untyped.Type

Methods

rnf :: ParameterType -> () #

NFData T 
Instance details

Defined in Michelson.Untyped.Type

Methods

rnf :: T -> () #

NFData CryptoParseError 
Instance details

Defined in Tezos.Crypto.Util

Methods

rnf :: CryptoParseError -> () #

NFData UnicodeException 
Instance details

Defined in Data.Text.Encoding.Error

Methods

rnf :: UnicodeException -> () #

NFData Doc 
Instance details

Defined in Text.PrettyPrint.HughesPJ

Methods

rnf :: Doc -> () #

NFData TextDetails 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Methods

rnf :: TextDetails -> () #

NFData ZonedTime 
Instance details

Defined in Data.Time.LocalTime.Internal.ZonedTime

Methods

rnf :: ZonedTime -> () #

NFData LocalTime 
Instance details

Defined in Data.Time.LocalTime.Internal.LocalTime

Methods

rnf :: LocalTime -> () #

NFData UUID 
Instance details

Defined in Data.UUID.Types.Internal

Methods

rnf :: UUID -> () #

NFData a => NFData [a] 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: [a] -> () #

NFData a => NFData (Maybe a) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Maybe a -> () #

NFData a => NFData (Ratio a) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Ratio a -> () #

NFData (Ptr a)

Since: deepseq-1.4.2.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Ptr a -> () #

NFData (FunPtr a)

Since: deepseq-1.4.2.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: FunPtr a -> () #

NFData a => NFData (IResult a) 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

rnf :: IResult a -> () #

NFData a => NFData (Result a) 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

rnf :: Result a -> () #

NFData a => NFData (Complex a) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Complex a -> () #

NFData (Fixed a)

Since: deepseq-1.3.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Fixed a -> () #

NFData a => NFData (Min a)

Since: deepseq-1.4.2.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Min a -> () #

NFData a => NFData (Max a)

Since: deepseq-1.4.2.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Max a -> () #

NFData a => NFData (First a)

Since: deepseq-1.4.2.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: First a -> () #

NFData a => NFData (Last a)

Since: deepseq-1.4.2.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Last a -> () #

NFData m => NFData (WrappedMonoid m)

Since: deepseq-1.4.2.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: WrappedMonoid m -> () #

NFData a => NFData (Option a)

Since: deepseq-1.4.2.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Option a -> () #

NFData (StableName a)

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: StableName a -> () #

NFData a => NFData (ZipList a)

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: ZipList a -> () #

NFData a => NFData (Identity a)

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Identity a -> () #

NFData (IORef a)

NOTE: Only strict in the reference and not the referenced value.

Since: deepseq-1.4.2.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: IORef a -> () #

NFData a => NFData (First a)

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: First a -> () #

NFData a => NFData (Last a)

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Last a -> () #

NFData a => NFData (Dual a)

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Dual a -> () #

NFData a => NFData (Sum a)

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Sum a -> () #

NFData a => NFData (Product a)

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Product a -> () #

NFData a => NFData (Down a)

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Down a -> () #

NFData (MVar a)

NOTE: Only strict in the reference and not the referenced value.

Since: deepseq-1.4.2.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: MVar a -> () #

NFData a => NFData (NonEmpty a)

Since: deepseq-1.4.2.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: NonEmpty a -> () #

NFData (Dict c) 
Instance details

Defined in Data.Constraint

Methods

rnf :: Dict c -> () #

NFData a => NFData (IntMap a) 
Instance details

Defined in Data.IntMap.Internal

Methods

rnf :: IntMap a -> () #

NFData a => NFData (Tree a) 
Instance details

Defined in Data.Tree

Methods

rnf :: Tree a -> () #

NFData a => NFData (Seq a) 
Instance details

Defined in Data.Sequence.Internal

Methods

rnf :: Seq a -> () #

NFData a => NFData (FingerTree a) 
Instance details

Defined in Data.Sequence.Internal

Methods

rnf :: FingerTree a -> () #

NFData a => NFData (Digit a) 
Instance details

Defined in Data.Sequence.Internal

Methods

rnf :: Digit a -> () #

NFData a => NFData (Node a) 
Instance details

Defined in Data.Sequence.Internal

Methods

rnf :: Node a -> () #

NFData a => NFData (Elem a) 
Instance details

Defined in Data.Sequence.Internal

Methods

rnf :: Elem a -> () #

NFData a => NFData (Set a) 
Instance details

Defined in Data.Set.Internal

Methods

rnf :: Set a -> () #

NFData a => NFData (DList a) 
Instance details

Defined in Data.DList

Methods

rnf :: DList a -> () #

NFData a => NFData (Hashed a) 
Instance details

Defined in Data.Hashable.Class

Methods

rnf :: Hashed a -> () #

NFData (Vector a) 
Instance details

Defined in Data.Vector.Primitive

Methods

rnf :: Vector a -> () #

NFData (Vector a) 
Instance details

Defined in Data.Vector.Storable

Methods

rnf :: Vector a -> () #

NFData (Vector a) 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

rnf :: Vector a -> () #

NFData a => NFData (HashSet a) 
Instance details

Defined in Data.HashSet.Base

Methods

rnf :: HashSet a -> () #

NFData a => NFData (Vector a) 
Instance details

Defined in Data.Vector

Methods

rnf :: Vector a -> () #

NFData (Notes t) 
Instance details

Defined in Michelson.Typed.Annotation

Methods

rnf :: Notes t -> () #

NFData t => NFData (ErrorItem t) 
Instance details

Defined in Text.Megaparsec.Error

Methods

rnf :: ErrorItem t -> () #

NFData a => NFData (ErrorFancy a) 
Instance details

Defined in Text.Megaparsec.Error

Methods

rnf :: ErrorFancy a -> () #

NFData s => NFData (PosState s) 
Instance details

Defined in Text.Megaparsec.State

Methods

rnf :: PosState s -> () #

NFData (HST ts) 
Instance details

Defined in Michelson.TypeCheck.Types

Methods

rnf :: HST ts -> () #

NFData (PackedNotes a) 
Instance details

Defined in Michelson.Typed.Instr

Methods

rnf :: PackedNotes a -> () #

NFData (TestAssert s) 
Instance details

Defined in Michelson.Typed.Instr

Methods

rnf :: TestAssert s -> () #

NFData (StackRef st) 
Instance details

Defined in Michelson.Typed.Instr

Methods

rnf :: StackRef st -> () #

NFData (PrintComment st) 
Instance details

Defined in Michelson.Typed.Instr

Methods

rnf :: PrintComment st -> () #

NFData (ExtInstr s) 
Instance details

Defined in Michelson.Typed.Instr

Methods

rnf :: ExtInstr s -> () #

NFData (Operation' instr) 
Instance details

Defined in Michelson.Typed.Value

Methods

rnf :: Operation' instr -> () #

NFData (SomeEntryPointCallT arg) 
Instance details

Defined in Michelson.Typed.EntryPoints

Methods

rnf :: SomeEntryPointCallT arg -> () #

NFData (ParamNotes t) 
Instance details

Defined in Michelson.Typed.EntryPoints

Methods

rnf :: ParamNotes t -> () #

NFData op => NFData (InstrAbstract op) 
Instance details

Defined in Michelson.Untyped.Instr

Methods

rnf :: InstrAbstract op -> () #

NFData op => NFData (Value' op) 
Instance details

Defined in Michelson.Untyped.Value

Methods

rnf :: Value' op -> () #

NFData op => NFData (Elt op) 
Instance details

Defined in Michelson.Untyped.Value

Methods

rnf :: Elt op -> () #

NFData (SingNat n) 
Instance details

Defined in Util.Peano

Methods

rnf :: SingNat n -> () #

NFData op => NFData (Contract' op) 
Instance details

Defined in Michelson.Untyped.Contract

Methods

rnf :: Contract' op -> () #

NFData op => NFData (ExtInstrAbstract op) 
Instance details

Defined in Michelson.Untyped.Ext

Methods

rnf :: ExtInstrAbstract op -> () #

NFData op => NFData (TestAssert op) 
Instance details

Defined in Michelson.Untyped.Ext

Methods

rnf :: TestAssert op -> () #

NFData a => NFData (Doc a) 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Methods

rnf :: Doc a -> () #

NFData a => NFData (AnnotDetails a) 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Methods

rnf :: AnnotDetails a -> () #

NFData (a -> b)

This instance is for convenience and consistency with seq. This assumes that WHNF is equivalent to NF for functions.

Since: deepseq-1.3.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: (a -> b) -> () #

(NFData a, NFData b) => NFData (Either a b) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Either a b -> () #

(NFData a, NFData b) => NFData (a, b) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: (a, b) -> () #

(NFData k, NFData v) => NFData (HashMap k v) 
Instance details

Defined in Data.HashMap.Base

Methods

rnf :: HashMap k v -> () #

(NFData k, NFData a) => NFData (Map k a) 
Instance details

Defined in Data.Map.Internal

Methods

rnf :: Map k a -> () #

(NFData a, NFData b) => NFData (Array a b) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Array a b -> () #

(NFData i, NFData r) => NFData (IResult i r) 
Instance details

Defined in Data.Attoparsec.Internal.Types

Methods

rnf :: IResult i r -> () #

(NFData a, NFData b) => NFData (Arg a b)

Since: deepseq-1.4.2.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Arg a b -> () #

NFData (Proxy a)

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Proxy a -> () #

NFData (STRef s a)

NOTE: Only strict in the reference and not the referenced value.

Since: deepseq-1.4.2.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: STRef s a -> () #

(NFData a, NFData b) => NFData (Bimap a b) 
Instance details

Defined in Data.Bimap

Methods

rnf :: Bimap a b -> () #

a => NFData (a :- b) 
Instance details

Defined in Data.Constraint

Methods

rnf :: (a :- b) -> () #

(NFData s, NFData (Token s), NFData e) => NFData (ParseErrorBundle s e) 
Instance details

Defined in Text.Megaparsec.Error

Methods

rnf :: ParseErrorBundle s e -> () #

(NFData s, NFData (ParseError s e)) => NFData (State s e) 
Instance details

Defined in Text.Megaparsec.State

Methods

rnf :: State s e -> () #

(NFData (Token s), NFData e) => NFData (ParseError s e) 
Instance details

Defined in Text.Megaparsec.Error

Methods

rnf :: ParseError s e -> () #

NFData (Instr out inp) 
Instance details

Defined in Michelson.Typed.Instr

Methods

rnf :: Instr out inp -> () #

NFData (Contract cp st) 
Instance details

Defined in Michelson.Typed.Instr

Methods

rnf :: Contract cp st -> () #

(NFData n, NFData m) => NFData (ArithError n m) 
Instance details

Defined in Michelson.Typed.Arith

Methods

rnf :: ArithError n m -> () #

NFData (TransferTokens instr p) 
Instance details

Defined in Michelson.Typed.Value

Methods

rnf :: TransferTokens instr p -> () #

NFData (Value' t instr) 
Instance details

Defined in Michelson.Typed.Value

Methods

rnf :: Value' t instr -> () #

NFData (EntryPointCallT param arg) 
Instance details

Defined in Michelson.Typed.EntryPoints

Methods

rnf :: EntryPointCallT param arg -> () #

NFData (EpLiftSequence param arg) 
Instance details

Defined in Michelson.Typed.EntryPoints

Methods

rnf :: EpLiftSequence param arg -> () #

NFData (Annotation tag) 
Instance details

Defined in Michelson.Untyped.Annotation

Methods

rnf :: Annotation tag -> () #

(NFData k, NFData v) => NFData (Leaf k v) 
Instance details

Defined in Data.HashMap.Base

Methods

rnf :: Leaf k v -> () #

NFData (MVector s a) 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

rnf :: MVector s a -> () #

(NFData a1, NFData a2, NFData a3) => NFData (a1, a2, a3) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: (a1, a2, a3) -> () #

NFData a => NFData (Const a b)

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Const a b -> () #

NFData (a :~: b)

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: (a :~: b) -> () #

NFData (instr (ContractInp cp st) (ContractOut st)) => NFData (CreateContract instr cp st) 
Instance details

Defined in Michelson.Typed.Value

Methods

rnf :: CreateContract instr cp st -> () #

NFData b => NFData (Tagged s b) 
Instance details

Defined in Data.Tagged

Methods

rnf :: Tagged s b -> () #

(NFData a1, NFData a2, NFData a3, NFData a4) => NFData (a1, a2, a3, a4) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: (a1, a2, a3, a4) -> () #

(NFData1 f, NFData1 g, NFData a) => NFData (Product f g a)

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Product f g a -> () #

(NFData1 f, NFData1 g, NFData a) => NFData (Sum f g a)

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Sum f g a -> () #

NFData (a :~~: b)

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: (a :~~: b) -> () #

(forall (o' :: k). NFData (instr i o')) => NFData (RemFail instr i o) 
Instance details

Defined in Michelson.Typed.Value

Methods

rnf :: RemFail instr i o -> () #

(NFData a1, NFData a2, NFData a3, NFData a4, NFData a5) => NFData (a1, a2, a3, a4, a5) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: (a1, a2, a3, a4, a5) -> () #

(NFData1 f, NFData1 g, NFData a) => NFData (Compose f g a)

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Compose f g a -> () #

(NFData a1, NFData a2, NFData a3, NFData a4, NFData a5, NFData a6) => NFData (a1, a2, a3, a4, a5, a6) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: (a1, a2, a3, a4, a5, a6) -> () #

(NFData a1, NFData a2, NFData a3, NFData a4, NFData a5, NFData a6, NFData a7) => NFData (a1, a2, a3, a4, a5, a6, a7) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: (a1, a2, a3, a4, a5, a6, a7) -> () #

(NFData a1, NFData a2, NFData a3, NFData a4, NFData a5, NFData a6, NFData a7, NFData a8) => NFData (a1, a2, a3, a4, a5, a6, a7, a8) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: (a1, a2, a3, a4, a5, a6, a7, a8) -> () #

(NFData a1, NFData a2, NFData a3, NFData a4, NFData a5, NFData a6, NFData a7, NFData a8, NFData a9) => NFData (a1, a2, a3, a4, a5, a6, a7, a8, a9) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: (a1, a2, a3, a4, a5, a6, a7, a8, a9) -> () #

force :: NFData a => a -> a #

a variant of deepseq that is useful in some circumstances:

force x = x `deepseq` x

force x fully evaluates x, and then returns it. Note that force x only performs evaluation when the value of force x itself is demanded, so essentially it turns shallow evaluation into deep evaluation.

force can be conveniently used in combination with ViewPatterns:

{-# LANGUAGE BangPatterns, ViewPatterns #-}
import Control.DeepSeq

someFun :: ComplexData -> SomeResult
someFun (force -> !arg) = {- 'arg' will be fully evaluated -}

Another useful application is to combine force with evaluate in order to force deep evaluation relative to other IO operations:

import Control.Exception (evaluate)
import Control.DeepSeq

main = do
  result <- evaluate $ force $ pureComputation
  {- 'result' will be fully evaluated at this point -}
  return ()

Finally, here's an exception safe variant of the readFile' example:

readFile' :: FilePath -> IO String
readFile' fn = bracket (openFile fn ReadMode) hClose $ \h ->
                       evaluate . force =<< hGetContents h

Since: deepseq-1.2.0.0

($!!) :: NFData a => (a -> b) -> a -> b infixr 0 #

the deep analogue of $!. In the expression f $!! x, x is fully evaluated before the function f is applied to it.

Since: deepseq-1.2.0.0

deepseq :: NFData a => a -> b -> b #

deepseq: fully evaluates the first argument, before returning the second.

The name deepseq is used to illustrate the relationship to seq: where seq is shallow in the sense that it only evaluates the top level of its argument, deepseq traverses the entire data structure evaluating it completely.

deepseq can be useful for forcing pending exceptions, eradicating space leaks, or forcing lazy I/O to happen. It is also useful in conjunction with parallel Strategies (see the parallel package).

There is no guarantee about the ordering of evaluation. The implementation may evaluate the components of the structure in any order or in parallel. To impose an actual order on evaluation, use pseq from Control.Parallel in the parallel package.

Since: deepseq-1.1.0.0

newtype MaybeT (m :: Type -> Type) a #

The parameterizable maybe monad, obtained by composing an arbitrary monad with the Maybe monad.

Computations are actions that may produce a value or exit.

The return function yields a computation that produces that value, while >>= sequences two subcomputations, exiting if either computation does.

Constructors

MaybeT 

Fields

Instances

Instances details
MonadTrans MaybeT 
Instance details

Defined in Control.Monad.Trans.Maybe

Methods

lift :: Monad m => m a -> MaybeT m a #

MonadReader r m => MonadReader r (MaybeT m) 
Instance details

Defined in Control.Monad.Reader.Class

Methods

ask :: MaybeT m r #

local :: (r -> r) -> MaybeT m a -> MaybeT m a #

reader :: (r -> a) -> MaybeT m a #

MonadState s m => MonadState s (MaybeT m) 
Instance details

Defined in Control.Monad.State.Class

Methods

get :: MaybeT m s #

put :: s -> MaybeT m () #

state :: (s -> (a, s)) -> MaybeT m a #

MonadError e m => MonadError e (MaybeT m) 
Instance details

Defined in Control.Monad.Error.Class

Methods

throwError :: e -> MaybeT m a #

catchError :: MaybeT m a -> (e -> MaybeT m a) -> MaybeT m a #

Monad m => Monad (MaybeT m) 
Instance details

Defined in Control.Monad.Trans.Maybe

Methods

(>>=) :: MaybeT m a -> (a -> MaybeT m b) -> MaybeT m b #

(>>) :: MaybeT m a -> MaybeT m b -> MaybeT m b #

return :: a -> MaybeT m a #

Functor m => Functor (MaybeT m) 
Instance details

Defined in Control.Monad.Trans.Maybe

Methods

fmap :: (a -> b) -> MaybeT m a -> MaybeT m b #

(<$) :: a -> MaybeT m b -> MaybeT m a #

MonadFix m => MonadFix (MaybeT m) 
Instance details

Defined in Control.Monad.Trans.Maybe

Methods

mfix :: (a -> MaybeT m a) -> MaybeT m a #

Monad m => MonadFail (MaybeT m) 
Instance details

Defined in Control.Monad.Trans.Maybe

Methods

fail :: String -> MaybeT m a #

(Functor m, Monad m) => Applicative (MaybeT m) 
Instance details

Defined in Control.Monad.Trans.Maybe

Methods

pure :: a -> MaybeT m a #

(<*>) :: MaybeT m (a -> b) -> MaybeT m a -> MaybeT m b #

liftA2 :: (a -> b -> c) -> MaybeT m a -> MaybeT m b -> MaybeT m c #

(*>) :: MaybeT m a -> MaybeT m b -> MaybeT m b #

(<*) :: MaybeT m a -> MaybeT m b -> MaybeT m a #

Foldable f => Foldable (MaybeT f) 
Instance details

Defined in Control.Monad.Trans.Maybe

Methods

fold :: Monoid m => MaybeT f m -> m #

foldMap :: Monoid m => (a -> m) -> MaybeT f a -> m #

foldMap' :: Monoid m => (a -> m) -> MaybeT f a -> m #

foldr :: (a -> b -> b) -> b -> MaybeT f a -> b #

foldr' :: (a -> b -> b) -> b -> MaybeT f a -> b #

foldl :: (b -> a -> b) -> b -> MaybeT f a -> b #

foldl' :: (b -> a -> b) -> b -> MaybeT f a -> b #

foldr1 :: (a -> a -> a) -> MaybeT f a -> a #

foldl1 :: (a -> a -> a) -> MaybeT f a -> a #

toList :: MaybeT f a -> [a] #

null :: MaybeT f a -> Bool #

length :: MaybeT f a -> Int #

elem :: Eq a => a -> MaybeT f a -> Bool #

maximum :: Ord a => MaybeT f a -> a #

minimum :: Ord a => MaybeT f a -> a #

sum :: Num a => MaybeT f a -> a #

product :: Num a => MaybeT f a -> a #

Traversable f => Traversable (MaybeT f) 
Instance details

Defined in Control.Monad.Trans.Maybe

Methods

traverse :: Applicative f0 => (a -> f0 b) -> MaybeT f a -> f0 (MaybeT f b) #

sequenceA :: Applicative f0 => MaybeT f (f0 a) -> f0 (MaybeT f a) #

mapM :: Monad m => (a -> m b) -> MaybeT f a -> m (MaybeT f b) #

sequence :: Monad m => MaybeT f (m a) -> m (MaybeT f a) #

Contravariant m => Contravariant (MaybeT m) 
Instance details

Defined in Control.Monad.Trans.Maybe

Methods

contramap :: (a -> b) -> MaybeT m b -> MaybeT m a #

(>$) :: b -> MaybeT m b -> MaybeT m a #

(Functor m, Monad m) => Alternative (MaybeT m) 
Instance details

Defined in Control.Monad.Trans.Maybe

Methods

empty :: MaybeT m a #

(<|>) :: MaybeT m a -> MaybeT m a -> MaybeT m a #

some :: MaybeT m a -> MaybeT m [a] #

many :: MaybeT m a -> MaybeT m [a] #

Monad m => MonadPlus (MaybeT m) 
Instance details

Defined in Control.Monad.Trans.Maybe

Methods

mzero :: MaybeT m a #

mplus :: MaybeT m a -> MaybeT m a -> MaybeT m a #

Eq1 m => Eq1 (MaybeT m) 
Instance details

Defined in Control.Monad.Trans.Maybe

Methods

liftEq :: (a -> b -> Bool) -> MaybeT m a -> MaybeT m b -> Bool #

Ord1 m => Ord1 (MaybeT m) 
Instance details

Defined in Control.Monad.Trans.Maybe

Methods

liftCompare :: (a -> b -> Ordering) -> MaybeT m a -> MaybeT m b -> Ordering #

Read1 m => Read1 (MaybeT m) 
Instance details

Defined in Control.Monad.Trans.Maybe

Methods

liftReadsPrec :: (Int -> ReadS a) -> ReadS [a] -> Int -> ReadS (MaybeT m a) #

liftReadList :: (Int -> ReadS a) -> ReadS [a] -> ReadS [MaybeT m a] #

liftReadPrec :: ReadPrec a -> ReadPrec [a] -> ReadPrec (MaybeT m a) #

liftReadListPrec :: ReadPrec a -> ReadPrec [a] -> ReadPrec [MaybeT m a] #

Show1 m => Show1 (MaybeT m) 
Instance details

Defined in Control.Monad.Trans.Maybe

Methods

liftShowsPrec :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> Int -> MaybeT m a -> ShowS #

liftShowList :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> [MaybeT m a] -> ShowS #

MonadZip m => MonadZip (MaybeT m) 
Instance details

Defined in Control.Monad.Trans.Maybe

Methods

mzip :: MaybeT m a -> MaybeT m b -> MaybeT m (a, b) #

mzipWith :: (a -> b -> c) -> MaybeT m a -> MaybeT m b -> MaybeT m c #

munzip :: MaybeT m (a, b) -> (MaybeT m a, MaybeT m b) #

MonadIO m => MonadIO (MaybeT m) 
Instance details

Defined in Control.Monad.Trans.Maybe

Methods

liftIO :: IO a -> MaybeT m a #

MonadThrow m => MonadThrow (MaybeT m)

Throws exceptions into the base monad.

Instance details

Defined in Control.Monad.Catch

Methods

throwM :: Exception e => e -> MaybeT m a #

MonadCatch m => MonadCatch (MaybeT m)

Catches exceptions from the base monad.

Instance details

Defined in Control.Monad.Catch

Methods

catch :: Exception e => MaybeT m a -> (e -> MaybeT m a) -> MaybeT m a #

MonadMask m => MonadMask (MaybeT m)

Since: exceptions-0.10.0

Instance details

Defined in Control.Monad.Catch

Methods

mask :: ((forall a. MaybeT m a -> MaybeT m a) -> MaybeT m b) -> MaybeT m b #

uninterruptibleMask :: ((forall a. MaybeT m a -> MaybeT m a) -> MaybeT m b) -> MaybeT m b #

generalBracket :: MaybeT m a -> (a -> ExitCase b -> MaybeT m c) -> (a -> MaybeT m b) -> MaybeT m (b, c) #

PrimMonad m => PrimMonad (MaybeT m) 
Instance details

Defined in Control.Monad.Primitive

Associated Types

type PrimState (MaybeT m) #

Methods

primitive :: (State# (PrimState (MaybeT m)) -> (# State# (PrimState (MaybeT m)), a #)) -> MaybeT m a #

Zoom m n s t => Zoom (MaybeT m) (MaybeT n) s t 
Instance details

Defined in Control.Lens.Zoom

Methods

zoom :: LensLike' (Zoomed (MaybeT m) c) t s -> MaybeT m c -> MaybeT n c #

Zoom m n s t => Zoom (MaybeT m) (MaybeT n) s t 
Instance details

Defined in Lens.Micro.Mtl.Internal

Methods

zoom :: LensLike' (Zoomed (MaybeT m) c) t s -> MaybeT m c -> MaybeT n c #

(Eq1 m, Eq a) => Eq (MaybeT m a) 
Instance details

Defined in Control.Monad.Trans.Maybe

Methods

(==) :: MaybeT m a -> MaybeT m a -> Bool #

(/=) :: MaybeT m a -> MaybeT m a -> Bool #

(Ord1 m, Ord a) => Ord (MaybeT m a) 
Instance details

Defined in Control.Monad.Trans.Maybe

Methods

compare :: MaybeT m a -> MaybeT m a -> Ordering #

(<) :: MaybeT m a -> MaybeT m a -> Bool #

(<=) :: MaybeT m a -> MaybeT m a -> Bool #

(>) :: MaybeT m a -> MaybeT m a -> Bool #

(>=) :: MaybeT m a -> MaybeT m a -> Bool #

max :: MaybeT m a -> MaybeT m a -> MaybeT m a #

min :: MaybeT m a -> MaybeT m a -> MaybeT m a #

(Read1 m, Read a) => Read (MaybeT m a) 
Instance details

Defined in Control.Monad.Trans.Maybe

(Show1 m, Show a) => Show (MaybeT m a) 
Instance details

Defined in Control.Monad.Trans.Maybe

Methods

showsPrec :: Int -> MaybeT m a -> ShowS #

show :: MaybeT m a -> String #

showList :: [MaybeT m a] -> ShowS #

Wrapped (MaybeT m a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (MaybeT m a) #

Methods

_Wrapped' :: Iso' (MaybeT m a) (Unwrapped (MaybeT m a)) #

t ~ MaybeT n b => Rewrapped (MaybeT m a) t 
Instance details

Defined in Control.Lens.Wrapped

type Zoomed (MaybeT m) 
Instance details

Defined in Control.Lens.Zoom

type Zoomed (MaybeT m) 
Instance details

Defined in Lens.Micro.Mtl.Internal

type PrimState (MaybeT m) 
Instance details

Defined in Control.Monad.Primitive

type Unwrapped (MaybeT m a) 
Instance details

Defined in Control.Lens.Wrapped

type Unwrapped (MaybeT m a) = m (Maybe a)

newtype ExceptT e (m :: Type -> Type) a #

A monad transformer that adds exceptions to other monads.

ExceptT constructs a monad parameterized over two things:

  • e - The exception type.
  • m - The inner monad.

The return function yields a computation that produces the given value, while >>= sequences two subcomputations, exiting on the first exception.

Constructors

ExceptT (m (Either e a)) 

Instances

Instances details
MonadReader r m => MonadReader r (ExceptT e m)

Since: mtl-2.2

Instance details

Defined in Control.Monad.Reader.Class

Methods

ask :: ExceptT e m r #

local :: (r -> r) -> ExceptT e m a -> ExceptT e m a #

reader :: (r -> a) -> ExceptT e m a #

MonadState s m => MonadState s (ExceptT e m)

Since: mtl-2.2

Instance details

Defined in Control.Monad.State.Class

Methods

get :: ExceptT e m s #

put :: s -> ExceptT e m () #

state :: (s -> (a, s)) -> ExceptT e m a #

Monad m => MonadError e (ExceptT e m)

Since: mtl-2.2

Instance details

Defined in Control.Monad.Error.Class

Methods

throwError :: e -> ExceptT e m a #

catchError :: ExceptT e m a -> (e -> ExceptT e m a) -> ExceptT e m a #

MonadTrans (ExceptT e) 
Instance details

Defined in Control.Monad.Trans.Except

Methods

lift :: Monad m => m a -> ExceptT e m a #

Monad m => Monad (ExceptT e m) 
Instance details

Defined in Control.Monad.Trans.Except

Methods

(>>=) :: ExceptT e m a -> (a -> ExceptT e m b) -> ExceptT e m b #

(>>) :: ExceptT e m a -> ExceptT e m b -> ExceptT e m b #

return :: a -> ExceptT e m a #

Functor m => Functor (ExceptT e m) 
Instance details

Defined in Control.Monad.Trans.Except

Methods

fmap :: (a -> b) -> ExceptT e m a -> ExceptT e m b #

(<$) :: a -> ExceptT e m b -> ExceptT e m a #

MonadFix m => MonadFix (ExceptT e m) 
Instance details

Defined in Control.Monad.Trans.Except

Methods

mfix :: (a -> ExceptT e m a) -> ExceptT e m a #

MonadFail m => MonadFail (ExceptT e m) 
Instance details

Defined in Control.Monad.Trans.Except

Methods

fail :: String -> ExceptT e m a #

(Functor m, Monad m) => Applicative (ExceptT e m) 
Instance details

Defined in Control.Monad.Trans.Except

Methods

pure :: a -> ExceptT e m a #

(<*>) :: ExceptT e m (a -> b) -> ExceptT e m a -> ExceptT e m b #

liftA2 :: (a -> b -> c) -> ExceptT e m a -> ExceptT e m b -> ExceptT e m c #

(*>) :: ExceptT e m a -> ExceptT e m b -> ExceptT e m b #

(<*) :: ExceptT e m a -> ExceptT e m b -> ExceptT e m a #

Foldable f => Foldable (ExceptT e f) 
Instance details

Defined in Control.Monad.Trans.Except

Methods

fold :: Monoid m => ExceptT e f m -> m #

foldMap :: Monoid m => (a -> m) -> ExceptT e f a -> m #

foldMap' :: Monoid m => (a -> m) -> ExceptT e f a -> m #

foldr :: (a -> b -> b) -> b -> ExceptT e f a -> b #

foldr' :: (a -> b -> b) -> b -> ExceptT e f a -> b #

foldl :: (b -> a -> b) -> b -> ExceptT e f a -> b #

foldl' :: (b -> a -> b) -> b -> ExceptT e f a -> b #

foldr1 :: (a -> a -> a) -> ExceptT e f a -> a #

foldl1 :: (a -> a -> a) -> ExceptT e f a -> a #

toList :: ExceptT e f a -> [a] #

null :: ExceptT e f a -> Bool #

length :: ExceptT e f a -> Int #

elem :: Eq a => a -> ExceptT e f a -> Bool #

maximum :: Ord a => ExceptT e f a -> a #

minimum :: Ord a => ExceptT e f a -> a #

sum :: Num a => ExceptT e f a -> a #

product :: Num a => ExceptT e f a -> a #

Traversable f => Traversable (ExceptT e f) 
Instance details

Defined in Control.Monad.Trans.Except

Methods

traverse :: Applicative f0 => (a -> f0 b) -> ExceptT e f a -> f0 (ExceptT e f b) #

sequenceA :: Applicative f0 => ExceptT e f (f0 a) -> f0 (ExceptT e f a) #

mapM :: Monad m => (a -> m b) -> ExceptT e f a -> m (ExceptT e f b) #

sequence :: Monad m => ExceptT e f (m a) -> m (ExceptT e f a) #

Contravariant m => Contravariant (ExceptT e m) 
Instance details

Defined in Control.Monad.Trans.Except

Methods

contramap :: (a -> b) -> ExceptT e m b -> ExceptT e m a #

(>$) :: b -> ExceptT e m b -> ExceptT e m a #

(Functor m, Monad m, Monoid e) => Alternative (ExceptT e m) 
Instance details

Defined in Control.Monad.Trans.Except

Methods

empty :: ExceptT e m a #

(<|>) :: ExceptT e m a -> ExceptT e m a -> ExceptT e m a #

some :: ExceptT e m a -> ExceptT e m [a] #

many :: ExceptT e m a -> ExceptT e m [a] #

(Monad m, Monoid e) => MonadPlus (ExceptT e m) 
Instance details

Defined in Control.Monad.Trans.Except

Methods

mzero :: ExceptT e m a #

mplus :: ExceptT e m a -> ExceptT e m a -> ExceptT e m a #

(Eq e, Eq1 m) => Eq1 (ExceptT e m) 
Instance details

Defined in Control.Monad.Trans.Except

Methods

liftEq :: (a -> b -> Bool) -> ExceptT e m a -> ExceptT e m b -> Bool #

(Ord e, Ord1 m) => Ord1 (ExceptT e m) 
Instance details

Defined in Control.Monad.Trans.Except

Methods

liftCompare :: (a -> b -> Ordering) -> ExceptT e m a -> ExceptT e m b -> Ordering #

(Read e, Read1 m) => Read1 (ExceptT e m) 
Instance details

Defined in Control.Monad.Trans.Except

Methods

liftReadsPrec :: (Int -> ReadS a) -> ReadS [a] -> Int -> ReadS (ExceptT e m a) #

liftReadList :: (Int -> ReadS a) -> ReadS [a] -> ReadS [ExceptT e m a] #

liftReadPrec :: ReadPrec a -> ReadPrec [a] -> ReadPrec (ExceptT e m a) #

liftReadListPrec :: ReadPrec a -> ReadPrec [a] -> ReadPrec [ExceptT e m a] #

(Show e, Show1 m) => Show1 (ExceptT e m) 
Instance details

Defined in Control.Monad.Trans.Except

Methods

liftShowsPrec :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> Int -> ExceptT e m a -> ShowS #

liftShowList :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> [ExceptT e m a] -> ShowS #

MonadZip m => MonadZip (ExceptT e m) 
Instance details

Defined in Control.Monad.Trans.Except

Methods

mzip :: ExceptT e m a -> ExceptT e m b -> ExceptT e m (a, b) #

mzipWith :: (a -> b -> c) -> ExceptT e m a -> ExceptT e m b -> ExceptT e m c #

munzip :: ExceptT e m (a, b) -> (ExceptT e m a, ExceptT e m b) #

MonadIO m => MonadIO (ExceptT e m) 
Instance details

Defined in Control.Monad.Trans.Except

Methods

liftIO :: IO a -> ExceptT e m a #

MonadThrow m => MonadThrow (ExceptT e m)

Throws exceptions into the base monad.

Instance details

Defined in Control.Monad.Catch

Methods

throwM :: Exception e0 => e0 -> ExceptT e m a #

MonadCatch m => MonadCatch (ExceptT e m)

Catches exceptions from the base monad.

Instance details

Defined in Control.Monad.Catch

Methods

catch :: Exception e0 => ExceptT e m a -> (e0 -> ExceptT e m a) -> ExceptT e m a #

MonadMask m => MonadMask (ExceptT e m)

Since: exceptions-0.9.0

Instance details

Defined in Control.Monad.Catch

Methods

mask :: ((forall a. ExceptT e m a -> ExceptT e m a) -> ExceptT e m b) -> ExceptT e m b #

uninterruptibleMask :: ((forall a. ExceptT e m a -> ExceptT e m a) -> ExceptT e m b) -> ExceptT e m b #

generalBracket :: ExceptT e m a -> (a -> ExitCase b -> ExceptT e m c) -> (a -> ExceptT e m b) -> ExceptT e m (b, c) #

PrimMonad m => PrimMonad (ExceptT e m) 
Instance details

Defined in Control.Monad.Primitive

Associated Types

type PrimState (ExceptT e m) #

Methods

primitive :: (State# (PrimState (ExceptT e m)) -> (# State# (PrimState (ExceptT e m)), a #)) -> ExceptT e m a #

Zoom m n s t => Zoom (ExceptT e m) (ExceptT e n) s t 
Instance details

Defined in Control.Lens.Zoom

Methods

zoom :: LensLike' (Zoomed (ExceptT e m) c) t s -> ExceptT e m c -> ExceptT e n c #

Zoom m n s t => Zoom (ExceptT e m) (ExceptT e n) s t 
Instance details

Defined in Lens.Micro.Mtl.Internal

Methods

zoom :: LensLike' (Zoomed (ExceptT e m) c) t s -> ExceptT e m c -> ExceptT e n c #

(Eq e, Eq1 m, Eq a) => Eq (ExceptT e m a) 
Instance details

Defined in Control.Monad.Trans.Except

Methods

(==) :: ExceptT e m a -> ExceptT e m a -> Bool #

(/=) :: ExceptT e m a -> ExceptT e m a -> Bool #

(Ord e, Ord1 m, Ord a) => Ord (ExceptT e m a) 
Instance details

Defined in Control.Monad.Trans.Except

Methods

compare :: ExceptT e m a -> ExceptT e m a -> Ordering #

(<) :: ExceptT e m a -> ExceptT e m a -> Bool #

(<=) :: ExceptT e m a -> ExceptT e m a -> Bool #

(>) :: ExceptT e m a -> ExceptT e m a -> Bool #

(>=) :: ExceptT e m a -> ExceptT e m a -> Bool #

max :: ExceptT e m a -> ExceptT e m a -> ExceptT e m a #

min :: ExceptT e m a -> ExceptT e m a -> ExceptT e m a #

(Read e, Read1 m, Read a) => Read (ExceptT e m a) 
Instance details

Defined in Control.Monad.Trans.Except

Methods

readsPrec :: Int -> ReadS (ExceptT e m a) #

readList :: ReadS [ExceptT e m a] #

readPrec :: ReadPrec (ExceptT e m a) #

readListPrec :: ReadPrec [ExceptT e m a] #

(Show e, Show1 m, Show a) => Show (ExceptT e m a) 
Instance details

Defined in Control.Monad.Trans.Except

Methods

showsPrec :: Int -> ExceptT e m a -> ShowS #

show :: ExceptT e m a -> String #

showList :: [ExceptT e m a] -> ShowS #

Wrapped (ExceptT e m a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (ExceptT e m a) #

Methods

_Wrapped' :: Iso' (ExceptT e m a) (Unwrapped (ExceptT e m a)) #

t ~ ExceptT e' m' a' => Rewrapped (ExceptT e m a) t 
Instance details

Defined in Control.Lens.Wrapped

type Zoomed (ExceptT e m) 
Instance details

Defined in Control.Lens.Zoom

type Zoomed (ExceptT e m) = FocusingErr e (Zoomed m)
type Zoomed (ExceptT e m) 
Instance details

Defined in Lens.Micro.Mtl.Internal

type Zoomed (ExceptT e m) = FocusingErr e (Zoomed m)
type PrimState (ExceptT e m) 
Instance details

Defined in Control.Monad.Primitive

type PrimState (ExceptT e m) = PrimState m
type Unwrapped (ExceptT e m a) 
Instance details

Defined in Control.Lens.Wrapped

type Unwrapped (ExceptT e m a) = m (Either e a)

class Monad m => MonadThrow (m :: Type -> Type) #

A class for monads in which exceptions may be thrown.

Instances should obey the following law:

throwM e >> x = throwM e

In other words, throwing an exception short-circuits the rest of the monadic computation.

Minimal complete definition

throwM

Instances

Instances details
MonadThrow [] 
Instance details

Defined in Control.Monad.Catch

Methods

throwM :: Exception e => e -> [a] #

MonadThrow Maybe 
Instance details

Defined in Control.Monad.Catch

Methods

throwM :: Exception e => e -> Maybe a #

MonadThrow IO 
Instance details

Defined in Control.Monad.Catch

Methods

throwM :: Exception e => e -> IO a #

MonadThrow Q 
Instance details

Defined in Control.Monad.Catch

Methods

throwM :: Exception e => e -> Q a #

MonadThrow STM 
Instance details

Defined in Control.Monad.Catch

Methods

throwM :: Exception e => e -> STM a #

e ~ SomeException => MonadThrow (Either e) 
Instance details

Defined in Control.Monad.Catch

Methods

throwM :: Exception e0 => e0 -> Either e a #

MonadThrow (ST s) 
Instance details

Defined in Control.Monad.Catch

Methods

throwM :: Exception e => e -> ST s a #

MonadThrow m => MonadThrow (MaybeT m)

Throws exceptions into the base monad.

Instance details

Defined in Control.Monad.Catch

Methods

throwM :: Exception e => e -> MaybeT m a #

MonadThrow m => MonadThrow (ListT m) 
Instance details

Defined in Control.Monad.Catch

Methods

throwM :: Exception e => e -> ListT m a #

MonadThrow m => MonadThrow (IdentityT m) 
Instance details

Defined in Control.Monad.Catch

Methods

throwM :: Exception e => e -> IdentityT m a #

MonadThrow m => MonadThrow (ExceptT e m)

Throws exceptions into the base monad.

Instance details

Defined in Control.Monad.Catch

Methods

throwM :: Exception e0 => e0 -> ExceptT e m a #

(Functor f, MonadThrow m) => MonadThrow (FreeT f m) 
Instance details

Defined in Control.Monad.Trans.Free

Methods

throwM :: Exception e => e -> FreeT f m a #

(Error e, MonadThrow m) => MonadThrow (ErrorT e m)

Throws exceptions into the base monad.

Instance details

Defined in Control.Monad.Catch

Methods

throwM :: Exception e0 => e0 -> ErrorT e m a #

MonadThrow m => MonadThrow (StateT s m) 
Instance details

Defined in Control.Monad.Catch

Methods

throwM :: Exception e => e -> StateT s m a #

MonadThrow m => MonadThrow (StateT s m) 
Instance details

Defined in Control.Monad.Catch

Methods

throwM :: Exception e => e -> StateT s m a #

MonadThrow m => MonadThrow (ReaderT r m) 
Instance details

Defined in Control.Monad.Catch

Methods

throwM :: Exception e => e -> ReaderT r m a #

(MonadThrow m, Monoid w) => MonadThrow (WriterT w m) 
Instance details

Defined in Control.Monad.Catch

Methods

throwM :: Exception e => e -> WriterT w m a #

(MonadThrow m, Monoid w) => MonadThrow (WriterT w m) 
Instance details

Defined in Control.Monad.Catch

Methods

throwM :: Exception e => e -> WriterT w m a #

MonadThrow m => MonadThrow (ContT r m) 
Instance details

Defined in Control.Monad.Catch

Methods

throwM :: Exception e => e -> ContT r m a #

(MonadThrow m, Monoid w) => MonadThrow (RWST r w s m) 
Instance details

Defined in Control.Monad.Catch

Methods

throwM :: Exception e => e -> RWST r w s m a #

(MonadThrow m, Monoid w) => MonadThrow (RWST r w s m) 
Instance details

Defined in Control.Monad.Catch

Methods

throwM :: Exception e => e -> RWST r w s m a #

class MonadThrow m => MonadCatch (m :: Type -> Type) #

A class for monads which allow exceptions to be caught, in particular exceptions which were thrown by throwM.

Instances should obey the following law:

catch (throwM e) f = f e

Note that the ability to catch an exception does not guarantee that we can deal with all possible exit points from a computation. Some monads, such as continuation-based stacks, allow for more than just a success/failure strategy, and therefore catch cannot be used by those monads to properly implement a function such as finally. For more information, see MonadMask.

Minimal complete definition

catch

Instances

Instances details
MonadCatch IO 
Instance details

Defined in Control.Monad.Catch

Methods

catch :: Exception e => IO a -> (e -> IO a) -> IO a #

MonadCatch STM 
Instance details

Defined in Control.Monad.Catch

Methods

catch :: Exception e => STM a -> (e -> STM a) -> STM a #

e ~ SomeException => MonadCatch (Either e)

Since: exceptions-0.8.3

Instance details

Defined in Control.Monad.Catch

Methods

catch :: Exception e0 => Either e a -> (e0 -> Either e a) -> Either e a #

MonadCatch m => MonadCatch (MaybeT m)

Catches exceptions from the base monad.

Instance details

Defined in Control.Monad.Catch

Methods

catch :: Exception e => MaybeT m a -> (e -> MaybeT m a) -> MaybeT m a #

MonadCatch m => MonadCatch (ListT m) 
Instance details

Defined in Control.Monad.Catch

Methods

catch :: Exception e => ListT m a -> (e -> ListT m a) -> ListT m a #

MonadCatch m => MonadCatch (IdentityT m) 
Instance details

Defined in Control.Monad.Catch

Methods

catch :: Exception e => IdentityT m a -> (e -> IdentityT m a) -> IdentityT m a #

MonadCatch m => MonadCatch (ExceptT e m)

Catches exceptions from the base monad.

Instance details

Defined in Control.Monad.Catch

Methods

catch :: Exception e0 => ExceptT e m a -> (e0 -> ExceptT e m a) -> ExceptT e m a #

(Functor f, MonadCatch m) => MonadCatch (FreeT f m) 
Instance details

Defined in Control.Monad.Trans.Free

Methods

catch :: Exception e => FreeT f m a -> (e -> FreeT f m a) -> FreeT f m a #

(Error e, MonadCatch m) => MonadCatch (ErrorT e m)

Catches exceptions from the base monad.

Instance details

Defined in Control.Monad.Catch

Methods

catch :: Exception e0 => ErrorT e m a -> (e0 -> ErrorT e m a) -> ErrorT e m a #

MonadCatch m => MonadCatch (StateT s m) 
Instance details

Defined in Control.Monad.Catch

Methods

catch :: Exception e => StateT s m a -> (e -> StateT s m a) -> StateT s m a #

MonadCatch m => MonadCatch (StateT s m) 
Instance details

Defined in Control.Monad.Catch

Methods

catch :: Exception e => StateT s m a -> (e -> StateT s m a) -> StateT s m a #

MonadCatch m => MonadCatch (ReaderT r m) 
Instance details

Defined in Control.Monad.Catch

Methods

catch :: Exception e => ReaderT r m a -> (e -> ReaderT r m a) -> ReaderT r m a #

(MonadCatch m, Monoid w) => MonadCatch (WriterT w m) 
Instance details

Defined in Control.Monad.Catch

Methods

catch :: Exception e => WriterT w m a -> (e -> WriterT w m a) -> WriterT w m a #

(MonadCatch m, Monoid w) => MonadCatch (WriterT w m) 
Instance details

Defined in Control.Monad.Catch

Methods

catch :: Exception e => WriterT w m a -> (e -> WriterT w m a) -> WriterT w m a #

(MonadCatch m, Monoid w) => MonadCatch (RWST r w s m) 
Instance details

Defined in Control.Monad.Catch

Methods

catch :: Exception e => RWST r w s m a -> (e -> RWST r w s m a) -> RWST r w s m a #

(MonadCatch m, Monoid w) => MonadCatch (RWST r w s m) 
Instance details

Defined in Control.Monad.Catch

Methods

catch :: Exception e => RWST r w s m a -> (e -> RWST r w s m a) -> RWST r w s m a #

class MonadCatch m => MonadMask (m :: Type -> Type) where #

A class for monads which provide for the ability to account for all possible exit points from a computation, and to mask asynchronous exceptions. Continuation-based monads are invalid instances of this class.

Instances should ensure that, in the following code:

fg = f `finally` g

The action g is called regardless of what occurs within f, including async exceptions. Some monads allow f to abort the computation via other effects than throwing an exception. For simplicity, we will consider aborting and throwing an exception to be two forms of "throwing an error".

If f and g both throw an error, the error thrown by fg depends on which errors we're talking about. In a monad transformer stack, the deeper layers override the effects of the inner layers; for example, ExceptT e1 (Except e2) a represents a value of type Either e2 (Either e1 a), so throwing both an e1 and an e2 will result in Left e2. If f and g both throw an error from the same layer, instances should ensure that the error from g wins.

Effects other than throwing an error are also overriden by the deeper layers. For example, StateT s Maybe a represents a value of type s -> Maybe (a, s), so if an error thrown from f causes this function to return Nothing, any changes to the state which f also performed will be erased. As a result, g will see the state as it was before f. Once g completes, f's error will be rethrown, so g' state changes will be erased as well. This is the normal interaction between effects in a monad transformer stack.

By contrast, lifted-base's version of finally always discards all of g's non-IO effects, and g never sees any of f's non-IO effects, regardless of the layer ordering and regardless of whether f throws an error. This is not the result of interacting effects, but a consequence of MonadBaseControl's approach.

Methods

mask :: ((forall a. m a -> m a) -> m b) -> m b #

Runs an action with asynchronous exceptions disabled. The action is provided a method for restoring the async. environment to what it was at the mask call. See Control.Exception's mask.

uninterruptibleMask :: ((forall a. m a -> m a) -> m b) -> m b #

Like mask, but the masked computation is not interruptible (see Control.Exception's uninterruptibleMask. WARNING: Only use if you need to mask exceptions around an interruptible operation AND you can guarantee the interruptible operation will only block for a short period of time. Otherwise you render the program/thread unresponsive and/or unkillable.

generalBracket #

Arguments

:: m a

acquire some resource

-> (a -> ExitCase b -> m c)

release the resource, observing the outcome of the inner action

-> (a -> m b)

inner action to perform with the resource

-> m (b, c) 

A generalized version of bracket which uses ExitCase to distinguish the different exit cases, and returns the values of both the use and release actions. In practice, this extra information is rarely needed, so it is often more convenient to use one of the simpler functions which are defined in terms of this one, such as bracket, finally, onError, and bracketOnError.

This function exists because in order to thread their effects through the execution of bracket, monad transformers need values to be threaded from use to release and from release to the output value.

NOTE This method was added in version 0.9.0 of this library. Previously, implementation of functions like bracket and finally in this module were based on the mask and uninterruptibleMask functions only, disallowing some classes of tranformers from having MonadMask instances (notably multi-exit-point transformers like ExceptT). If you are a library author, you'll now need to provide an implementation for this method. The StateT implementation demonstrates most of the subtleties:

generalBracket acquire release use = StateT $ s0 -> do
  ((b, _s2), (c, s3)) <- generalBracket
    (runStateT acquire s0)
    ((resource, s1) exitCase -> case exitCase of
      ExitCaseSuccess (b, s2) -> runStateT (release resource (ExitCaseSuccess b)) s2

      -- In the two other cases, the base monad overrides use's state
      -- changes and the state reverts to s1.
      ExitCaseException e     -> runStateT (release resource (ExitCaseException e)) s1
      ExitCaseAbort           -> runStateT (release resource ExitCaseAbort) s1
    )
    ((resource, s1) -> runStateT (use resource) s1)
  return ((b, c), s3)

The StateT s m implementation of generalBracket delegates to the m implementation of generalBracket. The acquire, use, and release arguments given to StateT's implementation produce actions of type StateT s m a, StateT s m b, and StateT s m c. In order to run those actions in the base monad, we need to call runStateT, from which we obtain actions of type m (a, s), m (b, s), and m (c, s). Since each action produces the next state, it is important to feed the state produced by the previous action to the next action.

In the ExitCaseSuccess case, the state starts at s0, flows through acquire to become s1, flows through use to become s2, and finally flows through release to become s3. In the other two cases, release does not receive the value s2, so its action cannot see the state changes performed by use. This is fine, because in those two cases, an error was thrown in the base monad, so as per the usual interaction between effects in a monad transformer stack, those state changes get reverted. So we start from s1 instead.

Finally, the m implementation of generalBracket returns the pairs (b, s) and (c, s). For monad transformers other than StateT, this will be some other type representing the effects and values performed and returned by the use and release actions. The effect part of the use result, in this case _s2, usually needs to be discarded, since those effects have already been incorporated in the release action.

The only effect which is intentionally not incorporated in the release action is the effect of throwing an error. In that case, the error must be re-thrown. One subtlety which is easy to miss is that in the case in which use and release both throw an error, the error from release should take priority. Here is an implementation for ExceptT which demonstrates how to do this.

generalBracket acquire release use = ExceptT $ do
  (eb, ec) <- generalBracket
    (runExceptT acquire)
    (eresource exitCase -> case eresource of
      Left e -> return (Left e) -- nothing to release, acquire didn't succeed
      Right resource -> case exitCase of
        ExitCaseSuccess (Right b) -> runExceptT (release resource (ExitCaseSuccess b))
        ExitCaseException e       -> runExceptT (release resource (ExitCaseException e))
        _                         -> runExceptT (release resource ExitCaseAbort))
    (either (return . Left) (runExceptT . use))
  return $ do
    -- The order in which we perform those two Either effects determines
    -- which error will win if they are both Lefts. We want the error from
    -- release to win.
    c <- ec
    b <- eb
    return (b, c)

Since: exceptions-0.9.0

Instances

Instances details
MonadMask IO 
Instance details

Defined in Control.Monad.Catch

Methods

mask :: ((forall a. IO a -> IO a) -> IO b) -> IO b #

uninterruptibleMask :: ((forall a. IO a -> IO a) -> IO b) -> IO b #

generalBracket :: IO a -> (a -> ExitCase b -> IO c) -> (a -> IO b) -> IO (b, c) #

e ~ SomeException => MonadMask (Either e)

Since: exceptions-0.8.3

Instance details

Defined in Control.Monad.Catch

Methods

mask :: ((forall a. Either e a -> Either e a) -> Either e b) -> Either e b #

uninterruptibleMask :: ((forall a. Either e a -> Either e a) -> Either e b) -> Either e b #

generalBracket :: Either e a -> (a -> ExitCase b -> Either e c) -> (a -> Either e b) -> Either e (b, c) #

MonadMask m => MonadMask (MaybeT m)

Since: exceptions-0.10.0

Instance details

Defined in Control.Monad.Catch

Methods

mask :: ((forall a. MaybeT m a -> MaybeT m a) -> MaybeT m b) -> MaybeT m b #

uninterruptibleMask :: ((forall a. MaybeT m a -> MaybeT m a) -> MaybeT m b) -> MaybeT m b #

generalBracket :: MaybeT m a -> (a -> ExitCase b -> MaybeT m c) -> (a -> MaybeT m b) -> MaybeT m (b, c) #

MonadMask m => MonadMask (IdentityT m) 
Instance details

Defined in Control.Monad.Catch

Methods

mask :: ((forall a. IdentityT m a -> IdentityT m a) -> IdentityT m b) -> IdentityT m b #

uninterruptibleMask :: ((forall a. IdentityT m a -> IdentityT m a) -> IdentityT m b) -> IdentityT m b #

generalBracket :: IdentityT m a -> (a -> ExitCase b -> IdentityT m c) -> (a -> IdentityT m b) -> IdentityT m (b, c) #

MonadMask m => MonadMask (ExceptT e m)

Since: exceptions-0.9.0

Instance details

Defined in Control.Monad.Catch

Methods

mask :: ((forall a. ExceptT e m a -> ExceptT e m a) -> ExceptT e m b) -> ExceptT e m b #

uninterruptibleMask :: ((forall a. ExceptT e m a -> ExceptT e m a) -> ExceptT e m b) -> ExceptT e m b #

generalBracket :: ExceptT e m a -> (a -> ExitCase b -> ExceptT e m c) -> (a -> ExceptT e m b) -> ExceptT e m (b, c) #

(Error e, MonadMask m) => MonadMask (ErrorT e m) 
Instance details

Defined in Control.Monad.Catch

Methods

mask :: ((forall a. ErrorT e m a -> ErrorT e m a) -> ErrorT e m b) -> ErrorT e m b #

uninterruptibleMask :: ((forall a. ErrorT e m a -> ErrorT e m a) -> ErrorT e m b) -> ErrorT e m b #

generalBracket :: ErrorT e m a -> (a -> ExitCase b -> ErrorT e m c) -> (a -> ErrorT e m b) -> ErrorT e m (b, c) #

MonadMask m => MonadMask (StateT s m) 
Instance details

Defined in Control.Monad.Catch

Methods

mask :: ((forall a. StateT s m a -> StateT s m a) -> StateT s m b) -> StateT s m b #

uninterruptibleMask :: ((forall a. StateT s m a -> StateT s m a) -> StateT s m b) -> StateT s m b #

generalBracket :: StateT s m a -> (a -> ExitCase b -> StateT s m c) -> (a -> StateT s m b) -> StateT s m (b, c) #

MonadMask m => MonadMask (StateT s m) 
Instance details

Defined in Control.Monad.Catch

Methods

mask :: ((forall a. StateT s m a -> StateT s m a) -> StateT s m b) -> StateT s m b #

uninterruptibleMask :: ((forall a. StateT s m a -> StateT s m a) -> StateT s m b) -> StateT s m b #

generalBracket :: StateT s m a -> (a -> ExitCase b -> StateT s m c) -> (a -> StateT s m b) -> StateT s m (b, c) #

MonadMask m => MonadMask (ReaderT r m) 
Instance details

Defined in Control.Monad.Catch

Methods

mask :: ((forall a. ReaderT r m a -> ReaderT r m a) -> ReaderT r m b) -> ReaderT r m b #

uninterruptibleMask :: ((forall a. ReaderT r m a -> ReaderT r m a) -> ReaderT r m b) -> ReaderT r m b #

generalBracket :: ReaderT r m a -> (a -> ExitCase b -> ReaderT r m c) -> (a -> ReaderT r m b) -> ReaderT r m (b, c) #

(MonadMask m, Monoid w) => MonadMask (WriterT w m) 
Instance details

Defined in Control.Monad.Catch

Methods

mask :: ((forall a. WriterT w m a -> WriterT w m a) -> WriterT w m b) -> WriterT w m b #

uninterruptibleMask :: ((forall a. WriterT w m a -> WriterT w m a) -> WriterT w m b) -> WriterT w m b #

generalBracket :: WriterT w m a -> (a -> ExitCase b -> WriterT w m c) -> (a -> WriterT w m b) -> WriterT w m (b, c) #

(MonadMask m, Monoid w) => MonadMask (WriterT w m) 
Instance details

Defined in Control.Monad.Catch

Methods

mask :: ((forall a. WriterT w m a -> WriterT w m a) -> WriterT w m b) -> WriterT w m b #

uninterruptibleMask :: ((forall a. WriterT w m a -> WriterT w m a) -> WriterT w m b) -> WriterT w m b #

generalBracket :: WriterT w m a -> (a -> ExitCase b -> WriterT w m c) -> (a -> WriterT w m b) -> WriterT w m (b, c) #

(MonadMask m, Monoid w) => MonadMask (RWST r w s m) 
Instance details

Defined in Control.Monad.Catch

Methods

mask :: ((forall a. RWST r w s m a -> RWST r w s m a) -> RWST r w s m b) -> RWST r w s m b #

uninterruptibleMask :: ((forall a. RWST r w s m a -> RWST r w s m a) -> RWST r w s m b) -> RWST r w s m b #

generalBracket :: RWST r w s m a -> (a -> ExitCase b -> RWST r w s m c) -> (a -> RWST r w s m b) -> RWST r w s m (b, c) #

(MonadMask m, Monoid w) => MonadMask (RWST r w s m) 
Instance details

Defined in Control.Monad.Catch

Methods

mask :: ((forall a. RWST r w s m a -> RWST r w s m a) -> RWST r w s m b) -> RWST r w s m b #

uninterruptibleMask :: ((forall a. RWST r w s m a -> RWST r w s m a) -> RWST r w s m b) -> RWST r w s m b #

generalBracket :: RWST r w s m a -> (a -> ExitCase b -> RWST r w s m c) -> (a -> RWST r w s m b) -> RWST r w s m (b, c) #

toStrict :: Text -> Text #

O(n) Convert a lazy Text into a strict Text.

data HashSet a #

A set of values. A set cannot contain duplicate values.

Instances

Instances details
Foldable HashSet 
Instance details

Defined in Data.HashSet.Base

Methods

fold :: Monoid m => HashSet m -> m #

foldMap :: Monoid m => (a -> m) -> HashSet a -> m #

foldMap' :: Monoid m => (a -> m) -> HashSet a -> m #

foldr :: (a -> b -> b) -> b -> HashSet a -> b #

foldr' :: (a -> b -> b) -> b -> HashSet a -> b #

foldl :: (b -> a -> b) -> b -> HashSet a -> b #

foldl' :: (b -> a -> b) -> b -> HashSet a -> b #

foldr1 :: (a -> a -> a) -> HashSet a -> a #

foldl1 :: (a -> a -> a) -> HashSet a -> a #

toList :: HashSet a -> [a] #

null :: HashSet a -> Bool #

length :: HashSet a -> Int #

elem :: Eq a => a -> HashSet a -> Bool #

maximum :: Ord a => HashSet a -> a #

minimum :: Ord a => HashSet a -> a #

sum :: Num a => HashSet a -> a #

product :: Num a => HashSet a -> a #

Eq1 HashSet 
Instance details

Defined in Data.HashSet.Base

Methods

liftEq :: (a -> b -> Bool) -> HashSet a -> HashSet b -> Bool #

Ord1 HashSet 
Instance details

Defined in Data.HashSet.Base

Methods

liftCompare :: (a -> b -> Ordering) -> HashSet a -> HashSet b -> Ordering #

Show1 HashSet 
Instance details

Defined in Data.HashSet.Base

Methods

liftShowsPrec :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> Int -> HashSet a -> ShowS #

liftShowList :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> [HashSet a] -> ShowS #

Hashable1 HashSet 
Instance details

Defined in Data.HashSet.Base

Methods

liftHashWithSalt :: (Int -> a -> Int) -> Int -> HashSet a -> Int #

(Eq a, Hashable a) => IsList (HashSet a) 
Instance details

Defined in Data.HashSet.Base

Associated Types

type Item (HashSet a) #

Methods

fromList :: [Item (HashSet a)] -> HashSet a #

fromListN :: Int -> [Item (HashSet a)] -> HashSet a #

toList :: HashSet a -> [Item (HashSet a)] #

Eq a => Eq (HashSet a) 
Instance details

Defined in Data.HashSet.Base

Methods

(==) :: HashSet a -> HashSet a -> Bool #

(/=) :: HashSet a -> HashSet a -> Bool #

(Data a, Eq a, Hashable a) => Data (HashSet a) 
Instance details

Defined in Data.HashSet.Base

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> HashSet a -> c (HashSet a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (HashSet a) #

toConstr :: HashSet a -> Constr #

dataTypeOf :: HashSet a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (HashSet a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (HashSet a)) #

gmapT :: (forall b. Data b => b -> b) -> HashSet a -> HashSet a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> HashSet a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> HashSet a -> r #

gmapQ :: (forall d. Data d => d -> u) -> HashSet a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> HashSet a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> HashSet a -> m (HashSet a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> HashSet a -> m (HashSet a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> HashSet a -> m (HashSet a) #

Ord a => Ord (HashSet a) 
Instance details

Defined in Data.HashSet.Base

Methods

compare :: HashSet a -> HashSet a -> Ordering #

(<) :: HashSet a -> HashSet a -> Bool #

(<=) :: HashSet a -> HashSet a -> Bool #

(>) :: HashSet a -> HashSet a -> Bool #

(>=) :: HashSet a -> HashSet a -> Bool #

max :: HashSet a -> HashSet a -> HashSet a #

min :: HashSet a -> HashSet a -> HashSet a #

(Eq a, Hashable a, Read a) => Read (HashSet a) 
Instance details

Defined in Data.HashSet.Base

Show a => Show (HashSet a) 
Instance details

Defined in Data.HashSet.Base

Methods

showsPrec :: Int -> HashSet a -> ShowS #

show :: HashSet a -> String #

showList :: [HashSet a] -> ShowS #

(Hashable a, Eq a) => Semigroup (HashSet a) 
Instance details

Defined in Data.HashSet.Base

Methods

(<>) :: HashSet a -> HashSet a -> HashSet a #

sconcat :: NonEmpty (HashSet a) -> HashSet a #

stimes :: Integral b => b -> HashSet a -> HashSet a #

(Hashable a, Eq a) => Monoid (HashSet a) 
Instance details

Defined in Data.HashSet.Base

Methods

mempty :: HashSet a #

mappend :: HashSet a -> HashSet a -> HashSet a #

mconcat :: [HashSet a] -> HashSet a #

Hashable a => Hashable (HashSet a) 
Instance details

Defined in Data.HashSet.Base

Methods

hashWithSalt :: Int -> HashSet a -> Int #

hash :: HashSet a -> Int #

NFData a => NFData (HashSet a) 
Instance details

Defined in Data.HashSet.Base

Methods

rnf :: HashSet a -> () #

(Eq a, Hashable a) => Contains (HashSet a) 
Instance details

Defined in Control.Lens.At

Methods

contains :: Index (HashSet a) -> Lens' (HashSet a) Bool #

(Eq k, Hashable k) => Ixed (HashSet k) 
Instance details

Defined in Control.Lens.At

Methods

ix :: Index (HashSet k) -> Traversal' (HashSet k) (IxValue (HashSet k)) #

(Eq k, Hashable k) => At (HashSet k) 
Instance details

Defined in Control.Lens.At

Methods

at :: Index (HashSet k) -> Lens' (HashSet k) (Maybe (IxValue (HashSet k))) #

(Hashable a, Eq a) => Wrapped (HashSet a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (HashSet a) #

Methods

_Wrapped' :: Iso' (HashSet a) (Unwrapped (HashSet a)) #

Hashable v => One (HashSet v) 
Instance details

Defined in Universum.Container.Class

Associated Types

type OneItem (HashSet v) #

Methods

one :: OneItem (HashSet v) -> HashSet v #

(Eq v, Hashable v) => Container (HashSet v) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element (HashSet v) #

Methods

toList :: HashSet v -> [Element (HashSet v)] #

null :: HashSet v -> Bool #

foldr :: (Element (HashSet v) -> b -> b) -> b -> HashSet v -> b #

foldl :: (b -> Element (HashSet v) -> b) -> b -> HashSet v -> b #

foldl' :: (b -> Element (HashSet v) -> b) -> b -> HashSet v -> b #

length :: HashSet v -> Int #

elem :: Element (HashSet v) -> HashSet v -> Bool #

maximum :: HashSet v -> Element (HashSet v) #

minimum :: HashSet v -> Element (HashSet v) #

foldMap :: Monoid m => (Element (HashSet v) -> m) -> HashSet v -> m #

fold :: HashSet v -> Element (HashSet v) #

foldr' :: (Element (HashSet v) -> b -> b) -> b -> HashSet v -> b #

foldr1 :: (Element (HashSet v) -> Element (HashSet v) -> Element (HashSet v)) -> HashSet v -> Element (HashSet v) #

foldl1 :: (Element (HashSet v) -> Element (HashSet v) -> Element (HashSet v)) -> HashSet v -> Element (HashSet v) #

notElem :: Element (HashSet v) -> HashSet v -> Bool #

all :: (Element (HashSet v) -> Bool) -> HashSet v -> Bool #

any :: (Element (HashSet v) -> Bool) -> HashSet v -> Bool #

and :: HashSet v -> Bool #

or :: HashSet v -> Bool #

find :: (Element (HashSet v) -> Bool) -> HashSet v -> Maybe (Element (HashSet v)) #

safeHead :: HashSet v -> Maybe (Element (HashSet v)) #

(t ~ HashSet a', Hashable a, Eq a) => Rewrapped (HashSet a) t

Use wrapping fromList. Unwrapping returns some permutation of the list.

Instance details

Defined in Control.Lens.Wrapped

type Item (HashSet a) 
Instance details

Defined in Data.HashSet.Base

type Item (HashSet a) = a
type Index (HashSet a) 
Instance details

Defined in Control.Lens.At

type Index (HashSet a) = a
type IxValue (HashSet k) 
Instance details

Defined in Control.Lens.At

type IxValue (HashSet k) = ()
type Unwrapped (HashSet a) 
Instance details

Defined in Control.Lens.Wrapped

type Unwrapped (HashSet a) = [a]
type OneItem (HashSet v) 
Instance details

Defined in Universum.Container.Class

type OneItem (HashSet v) = v
type Element (HashSet v) 
Instance details

Defined in Universum.Container.Class

type Element (HashSet v) = ElementDefault (HashSet v)

newtype StateT s (m :: Type -> Type) a #

A state transformer monad parameterized by:

  • s - The state.
  • m - The inner monad.

The return function leaves the state unchanged, while >>= uses the final state of the first computation as the initial state of the second.

Constructors

StateT 

Fields

Instances

Instances details
MonadReader r m => MonadReader r (StateT s m) 
Instance details

Defined in Control.Monad.Reader.Class

Methods

ask :: StateT s m r #

local :: (r -> r) -> StateT s m a -> StateT s m a #

reader :: (r -> a) -> StateT s m a #

Monad m => MonadState s (StateT s m) 
Instance details

Defined in Control.Monad.State.Class

Methods

get :: StateT s m s #

put :: s -> StateT s m () #

state :: (s -> (a, s)) -> StateT s m a #

MonadError e m => MonadError e (StateT s m) 
Instance details

Defined in Control.Monad.Error.Class

Methods

throwError :: e -> StateT s m a #

catchError :: StateT s m a -> (e -> StateT s m a) -> StateT s m a #

MonadTrans (StateT s) 
Instance details

Defined in Control.Monad.Trans.State.Strict

Methods

lift :: Monad m => m a -> StateT s m a #

Monad m => Monad (StateT s m) 
Instance details

Defined in Control.Monad.Trans.State.Strict

Methods

(>>=) :: StateT s m a -> (a -> StateT s m b) -> StateT s m b #

(>>) :: StateT s m a -> StateT s m b -> StateT s m b #

return :: a -> StateT s m a #

Functor m => Functor (StateT s m) 
Instance details

Defined in Control.Monad.Trans.State.Strict

Methods

fmap :: (a -> b) -> StateT s m a -> StateT s m b #

(<$) :: a -> StateT s m b -> StateT s m a #

MonadFix m => MonadFix (StateT s m) 
Instance details

Defined in Control.Monad.Trans.State.Strict

Methods

mfix :: (a -> StateT s m a) -> StateT s m a #

MonadFail m => MonadFail (StateT s m) 
Instance details

Defined in Control.Monad.Trans.State.Strict

Methods

fail :: String -> StateT s m a #

(Functor m, Monad m) => Applicative (StateT s m) 
Instance details

Defined in Control.Monad.Trans.State.Strict

Methods

pure :: a -> StateT s m a #

(<*>) :: StateT s m (a -> b) -> StateT s m a -> StateT s m b #

liftA2 :: (a -> b -> c) -> StateT s m a -> StateT s m b -> StateT s m c #

(*>) :: StateT s m a -> StateT s m b -> StateT s m b #

(<*) :: StateT s m a -> StateT s m b -> StateT s m a #

Contravariant m => Contravariant (StateT s m) 
Instance details

Defined in Control.Monad.Trans.State.Strict

Methods

contramap :: (a -> b) -> StateT s m b -> StateT s m a #

(>$) :: b -> StateT s m b -> StateT s m a #

(Functor m, MonadPlus m) => Alternative (StateT s m) 
Instance details

Defined in Control.Monad.Trans.State.Strict

Methods

empty :: StateT s m a #

(<|>) :: StateT s m a -> StateT s m a -> StateT s m a #

some :: StateT s m a -> StateT s m [a] #

many :: StateT s m a -> StateT s m [a] #

MonadPlus m => MonadPlus (StateT s m) 
Instance details

Defined in Control.Monad.Trans.State.Strict

Methods

mzero :: StateT s m a #

mplus :: StateT s m a -> StateT s m a -> StateT s m a #

MonadIO m => MonadIO (StateT s m) 
Instance details

Defined in Control.Monad.Trans.State.Strict

Methods

liftIO :: IO a -> StateT s m a #

MonadThrow m => MonadThrow (StateT s m) 
Instance details

Defined in Control.Monad.Catch

Methods

throwM :: Exception e => e -> StateT s m a #

MonadCatch m => MonadCatch (StateT s m) 
Instance details

Defined in Control.Monad.Catch

Methods

catch :: Exception e => StateT s m a -> (e -> StateT s m a) -> StateT s m a #

MonadMask m => MonadMask (StateT s m) 
Instance details

Defined in Control.Monad.Catch

Methods

mask :: ((forall a. StateT s m a -> StateT s m a) -> StateT s m b) -> StateT s m b #

uninterruptibleMask :: ((forall a. StateT s m a -> StateT s m a) -> StateT s m b) -> StateT s m b #

generalBracket :: StateT s m a -> (a -> ExitCase b -> StateT s m c) -> (a -> StateT s m b) -> StateT s m (b, c) #

PrimMonad m => PrimMonad (StateT s m) 
Instance details

Defined in Control.Monad.Primitive

Associated Types

type PrimState (StateT s m) #

Methods

primitive :: (State# (PrimState (StateT s m)) -> (# State# (PrimState (StateT s m)), a #)) -> StateT s m a #

Monad z => Zoom (StateT s z) (StateT t z) s t 
Instance details

Defined in Control.Lens.Zoom

Methods

zoom :: LensLike' (Zoomed (StateT s z) c) t s -> StateT s z c -> StateT t z c #

Monad z => Zoom (StateT s z) (StateT t z) s t 
Instance details

Defined in Lens.Micro.Mtl.Internal

Methods

zoom :: LensLike' (Zoomed (StateT s z) c) t s -> StateT s z c -> StateT t z c #

Wrapped (StateT s m a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (StateT s m a) #

Methods

_Wrapped' :: Iso' (StateT s m a) (Unwrapped (StateT s m a)) #

t ~ StateT s' m' a' => Rewrapped (StateT s m a) t 
Instance details

Defined in Control.Lens.Wrapped

type Zoomed (StateT s z) 
Instance details

Defined in Control.Lens.Zoom

type Zoomed (StateT s z) = Focusing z
type Zoomed (StateT s z) 
Instance details

Defined in Lens.Micro.Mtl.Internal

type Zoomed (StateT s z) = Focusing z
type PrimState (StateT s m) 
Instance details

Defined in Control.Monad.Primitive

type PrimState (StateT s m) = PrimState m
type Unwrapped (StateT s m a) 
Instance details

Defined in Control.Lens.Wrapped

type Unwrapped (StateT s m a) = s -> m (a, s)

type State s = StateT s Identity #

A state monad parameterized by the type s of the state to carry.

The return function leaves the state unchanged, while >>= uses the final state of the first computation as the initial state of the second.

data Vector a #

Boxed vectors, supporting efficient slicing.

Instances

Instances details
Monad Vector 
Instance details

Defined in Data.Vector

Methods

(>>=) :: Vector a -> (a -> Vector b) -> Vector b #

(>>) :: Vector a -> Vector b -> Vector b #

return :: a -> Vector a #

Functor Vector 
Instance details

Defined in Data.Vector

Methods

fmap :: (a -> b) -> Vector a -> Vector b #

(<$) :: a -> Vector b -> Vector a #

MonadFail Vector

Since: vector-0.12.1.0

Instance details

Defined in Data.Vector

Methods

fail :: String -> Vector a #

Applicative Vector 
Instance details

Defined in Data.Vector

Methods

pure :: a -> Vector a #

(<*>) :: Vector (a -> b) -> Vector a -> Vector b #

liftA2 :: (a -> b -> c) -> Vector a -> Vector b -> Vector c #

(*>) :: Vector a -> Vector b -> Vector b #

(<*) :: Vector a -> Vector b -> Vector a #

Foldable Vector 
Instance details

Defined in Data.Vector

Methods

fold :: Monoid m => Vector m -> m #

foldMap :: Monoid m => (a -> m) -> Vector a -> m #

foldMap' :: Monoid m => (a -> m) -> Vector a -> m #

foldr :: (a -> b -> b) -> b -> Vector a -> b #

foldr' :: (a -> b -> b) -> b -> Vector a -> b #

foldl :: (b -> a -> b) -> b -> Vector a -> b #

foldl' :: (b -> a -> b) -> b -> Vector a -> b #

foldr1 :: (a -> a -> a) -> Vector a -> a #

foldl1 :: (a -> a -> a) -> Vector a -> a #

toList :: Vector a -> [a] #

null :: Vector a -> Bool #

length :: Vector a -> Int #

elem :: Eq a => a -> Vector a -> Bool #

maximum :: Ord a => Vector a -> a #

minimum :: Ord a => Vector a -> a #

sum :: Num a => Vector a -> a #

product :: Num a => Vector a -> a #

Traversable Vector 
Instance details

Defined in Data.Vector

Methods

traverse :: Applicative f => (a -> f b) -> Vector a -> f (Vector b) #

sequenceA :: Applicative f => Vector (f a) -> f (Vector a) #

mapM :: Monad m => (a -> m b) -> Vector a -> m (Vector b) #

sequence :: Monad m => Vector (m a) -> m (Vector a) #

Alternative Vector 
Instance details

Defined in Data.Vector

Methods

empty :: Vector a #

(<|>) :: Vector a -> Vector a -> Vector a #

some :: Vector a -> Vector [a] #

many :: Vector a -> Vector [a] #

MonadPlus Vector 
Instance details

Defined in Data.Vector

Methods

mzero :: Vector a #

mplus :: Vector a -> Vector a -> Vector a #

Eq1 Vector 
Instance details

Defined in Data.Vector

Methods

liftEq :: (a -> b -> Bool) -> Vector a -> Vector b -> Bool #

Ord1 Vector 
Instance details

Defined in Data.Vector

Methods

liftCompare :: (a -> b -> Ordering) -> Vector a -> Vector b -> Ordering #

Read1 Vector 
Instance details

Defined in Data.Vector

Methods

liftReadsPrec :: (Int -> ReadS a) -> ReadS [a] -> Int -> ReadS (Vector a) #

liftReadList :: (Int -> ReadS a) -> ReadS [a] -> ReadS [Vector a] #

liftReadPrec :: ReadPrec a -> ReadPrec [a] -> ReadPrec (Vector a) #

liftReadListPrec :: ReadPrec a -> ReadPrec [a] -> ReadPrec [Vector a] #

Show1 Vector 
Instance details

Defined in Data.Vector

Methods

liftShowsPrec :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> Int -> Vector a -> ShowS #

liftShowList :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> [Vector a] -> ShowS #

MonadZip Vector 
Instance details

Defined in Data.Vector

Methods

mzip :: Vector a -> Vector b -> Vector (a, b) #

mzipWith :: (a -> b -> c) -> Vector a -> Vector b -> Vector c #

munzip :: Vector (a, b) -> (Vector a, Vector b) #

NFData1 Vector

Since: vector-0.12.1.0

Instance details

Defined in Data.Vector

Methods

liftRnf :: (a -> ()) -> Vector a -> () #

Vector Vector a 
Instance details

Defined in Data.Vector

Methods

basicUnsafeFreeze :: PrimMonad m => Mutable Vector (PrimState m) a -> m (Vector a) #

basicUnsafeThaw :: PrimMonad m => Vector a -> m (Mutable Vector (PrimState m) a) #

basicLength :: Vector a -> Int #

basicUnsafeSlice :: Int -> Int -> Vector a -> Vector a #

basicUnsafeIndexM :: Monad m => Vector a -> Int -> m a #

basicUnsafeCopy :: PrimMonad m => Mutable Vector (PrimState m) a -> Vector a -> m () #

elemseq :: Vector a -> a -> b -> b #

IsList (Vector a) 
Instance details

Defined in Data.Vector

Associated Types

type Item (Vector a) #

Methods

fromList :: [Item (Vector a)] -> Vector a #

fromListN :: Int -> [Item (Vector a)] -> Vector a #

toList :: Vector a -> [Item (Vector a)] #

Eq a => Eq (Vector a) 
Instance details

Defined in Data.Vector

Methods

(==) :: Vector a -> Vector a -> Bool #

(/=) :: Vector a -> Vector a -> Bool #

Data a => Data (Vector a) 
Instance details

Defined in Data.Vector

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Vector a -> c (Vector a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Vector a) #

toConstr :: Vector a -> Constr #

dataTypeOf :: Vector a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Vector a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Vector a)) #

gmapT :: (forall b. Data b => b -> b) -> Vector a -> Vector a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Vector a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Vector a -> r #

gmapQ :: (forall d. Data d => d -> u) -> Vector a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Vector a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Vector a -> m (Vector a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Vector a -> m (Vector a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Vector a -> m (Vector a) #

Ord a => Ord (Vector a) 
Instance details

Defined in Data.Vector

Methods

compare :: Vector a -> Vector a -> Ordering #

(<) :: Vector a -> Vector a -> Bool #

(<=) :: Vector a -> Vector a -> Bool #

(>) :: Vector a -> Vector a -> Bool #

(>=) :: Vector a -> Vector a -> Bool #

max :: Vector a -> Vector a -> Vector a #

min :: Vector a -> Vector a -> Vector a #

Read a => Read (Vector a) 
Instance details

Defined in Data.Vector

Show a => Show (Vector a) 
Instance details

Defined in Data.Vector

Methods

showsPrec :: Int -> Vector a -> ShowS #

show :: Vector a -> String #

showList :: [Vector a] -> ShowS #

Semigroup (Vector a) 
Instance details

Defined in Data.Vector

Methods

(<>) :: Vector a -> Vector a -> Vector a #

sconcat :: NonEmpty (Vector a) -> Vector a #

stimes :: Integral b => b -> 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 #

NFData a => NFData (Vector a) 
Instance details

Defined in Data.Vector

Methods

rnf :: Vector a -> () #

Ixed (Vector a) 
Instance details

Defined in Control.Lens.At

Methods

ix :: Index (Vector a) -> Traversal' (Vector a) (IxValue (Vector a)) #

Wrapped (Vector a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (Vector a) #

Methods

_Wrapped' :: Iso' (Vector a) (Unwrapped (Vector a)) #

One (Vector a) 
Instance details

Defined in Universum.Container.Class

Associated Types

type OneItem (Vector a) #

Methods

one :: OneItem (Vector a) -> Vector a #

Container (Vector a) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element (Vector a) #

Methods

toList :: Vector a -> [Element (Vector a)] #

null :: Vector a -> Bool #

foldr :: (Element (Vector a) -> b -> b) -> b -> Vector a -> b #

foldl :: (b -> Element (Vector a) -> b) -> b -> Vector a -> b #

foldl' :: (b -> Element (Vector a) -> b) -> b -> Vector a -> b #

length :: Vector a -> Int #

elem :: Element (Vector a) -> Vector a -> Bool #

maximum :: Vector a -> Element (Vector a) #

minimum :: Vector a -> Element (Vector a) #

foldMap :: Monoid m => (Element (Vector a) -> m) -> Vector a -> m #

fold :: Vector a -> Element (Vector a) #

foldr' :: (Element (Vector a) -> b -> b) -> b -> Vector a -> b #

foldr1 :: (Element (Vector a) -> Element (Vector a) -> Element (Vector a)) -> Vector a -> Element (Vector a) #

foldl1 :: (Element (Vector a) -> Element (Vector a) -> Element (Vector a)) -> Vector a -> Element (Vector a) #

notElem :: Element (Vector a) -> Vector a -> Bool #

all :: (Element (Vector a) -> Bool) -> Vector a -> Bool #

any :: (Element (Vector a) -> Bool) -> Vector a -> Bool #

and :: Vector a -> Bool #

or :: Vector a -> Bool #

find :: (Element (Vector a) -> Bool) -> Vector a -> Maybe (Element (Vector a)) #

safeHead :: Vector a -> Maybe (Element (Vector a)) #

t ~ Vector a' => Rewrapped (Vector a) t 
Instance details

Defined in Control.Lens.Wrapped

type Mutable Vector 
Instance details

Defined in Data.Vector

type Item (Vector a) 
Instance details

Defined in Data.Vector

type Item (Vector a) = a
type Index (Vector a) 
Instance details

Defined in Control.Lens.At

type Index (Vector a) = Int
type IxValue (Vector a) 
Instance details

Defined in Control.Lens.At

type IxValue (Vector a) = a
type Unwrapped (Vector a) 
Instance details

Defined in Control.Lens.Wrapped

type Unwrapped (Vector a) = [a]
type OneItem (Vector a) 
Instance details

Defined in Universum.Container.Class

type OneItem (Vector a) = a
type Element (Vector a) 
Instance details

Defined in Universum.Container.Class

type Element (Vector a) = ElementDefault (Vector a)

type Reader r = ReaderT r Identity #

The parameterizable reader monad.

Computations are functions of a shared environment.

The return function ignores the environment, while >>= passes the inherited environment to both subcomputations.

gets :: MonadState s m => (s -> a) -> m a #

Gets specific component of the state, using a projection function supplied.

type ($) (f :: k1 -> k) (a :: k1) = f a infixr 2 #

Infix application.

f :: Either String $ Maybe Int
=
f :: Either String (Maybe Int)

undefined :: forall (r :: RuntimeRep) (a :: TYPE r). HasCallStack => a #

undefined that leaves a warning in code on every usage.

error :: forall (r :: RuntimeRep) (a :: TYPE r). HasCallStack => Text -> a #

error that takes Text as an argument.

(^..) :: s -> Getting (Endo [a]) s a -> [a] infixl 8 #

s ^.. t returns the list of all values that t gets from s.

A Maybe contains either 0 or 1 values:

>>> Just 3 ^.. _Just
[3]

Gathering all values in a list of tuples:

>>> [(1,2),(3,4)] ^.. each.each
[1,2,3,4]

set :: ASetter s t a b -> b -> s -> t #

set is a synonym for (.~).

Setting the 1st component of a pair:

set _1 :: x -> (a, b) -> (x, b)
set _1 = \x t -> (x, snd t)

Using it to rewrite (<$):

set mapped :: Functor f => a -> f b -> f a
set mapped = (<$)

(.~) :: ASetter s t a b -> b -> s -> t infixr 4 #

(.~) assigns a value to the target. It's the same thing as using (%~) with const:

l .~ x = l %~ const x

See set if you want a non-operator synonym.

Here it is used to change 2 fields of a 3-tuple:

>>> (0,0,0) & _1 .~ 1 & _3 .~ 3
(1,0,3)

over :: ASetter s t a b -> (a -> b) -> s -> t #

over is a synonym for (%~).

Getting fmap in a roundabout way:

over mapped :: Functor f => (a -> b) -> f a -> f b
over mapped = fmap

Applying a function to both components of a pair:

over both :: (a -> b) -> (a, a) -> (b, b)
over both = \f t -> (f (fst t), f (snd t))

Using over _2 as a replacement for second:

>>> over _2 show (10,20)
(10,"20")

_1 :: Field1 s t a b => Lens s t a b #

Gives access to the 1st field of a tuple (up to 5-tuples).

Getting the 1st component:

>>> (1,2,3,4,5) ^. _1
1

Setting the 1st component:

>>> (1,2,3) & _1 .~ 10
(10,2,3)

Note that this lens is lazy, and can set fields even of undefined:

>>> set _1 10 undefined :: (Int, Int)
(10,*** Exception: Prelude.undefined

This is done to avoid violating a lens law stating that you can get back what you put:

>>> view _1 . set _1 10 $ (undefined :: (Int, Int))
10

The implementation (for 2-tuples) is:

_1 f t = (,) <$> f    (fst t)
             <*> pure (snd t)

or, alternatively,

_1 f ~(a,b) = (\a' -> (a',b)) <$> f a

(where ~ means a lazy pattern).

_2, _3, _4, and _5 are also available (see below).

_2 :: Field2 s t a b => Lens s t a b #

_3 :: Field3 s t a b => Lens s t a b #

_4 :: Field4 s t a b => Lens s t a b #

_5 :: Field5 s t a b => Lens s t a b #

type Lens s t a b = forall (f :: Type -> Type). Functor f => (a -> f b) -> s -> f t #

Lens s t a b is the lowest common denominator of a setter and a getter, something that has the power of both; it has a Functor constraint, and since both Const and Identity are functors, it can be used whenever a getter or a setter is needed.

  • a is the type of the value inside of structure
  • b is the type of the replaced value
  • s is the type of the whole structure
  • t is the type of the structure after replacing a in it with b

type Lens' s a = Lens s s a a #

This is a type alias for monomorphic lenses which don't change the type of the container (or of the value inside).

type Traversal s t a b = forall (f :: Type -> Type). Applicative f => (a -> f b) -> s -> f t #

Traversal s t a b is a generalisation of Lens which allows many targets (possibly 0). It's achieved by changing the constraint to Applicative instead of Functor – indeed, the point of Applicative is that you can combine effects, which is just what we need to have many targets.

Ultimately, traversals should follow 2 laws:

t pure ≡ pure
fmap (t f) . t g ≡ getCompose . t (Compose . fmap f . g)

The 1st law states that you can't change the shape of the structure or do anything funny with elements (traverse elements which aren't in the structure, create new elements out of thin air, etc.). The 2nd law states that you should be able to fuse 2 identical traversals into one. For a more detailed explanation of the laws, see this blog post (if you prefer rambling blog posts), or The Essence Of The Iterator Pattern (if you prefer papers).

Traversing any value twice is a violation of traversal laws. You can, however, traverse values in any order.

type Traversal' s a = Traversal s s a a #

This is a type alias for monomorphic traversals which don't change the type of the container (or of the values inside).

modify :: MonadState s m => (s -> s) -> m () #

Monadic state transformer.

Maps an old state to a new state inside a state monad. The old state is thrown away.

     Main> :t modify ((+1) :: Int -> Int)
     modify (...) :: (MonadState Int a) => a ()

This says that modify (+1) acts over any Monad that is a member of the MonadState class, with an Int state.

asks #

Arguments

:: MonadReader r m 
=> (r -> a)

The selector function to apply to the environment.

-> m a 

Retrieves a function of the current environment.

newtype ReaderT r (m :: Type -> Type) a #

The reader monad transformer, which adds a read-only environment to the given monad.

The return function ignores the environment, while >>= passes the inherited environment to both subcomputations.

Constructors

ReaderT 

Fields

Instances

Instances details
Monad m => MonadReader r (ReaderT r m) 
Instance details

Defined in Control.Monad.Reader.Class

Methods

ask :: ReaderT r m r #

local :: (r -> r) -> ReaderT r m a -> ReaderT r m a #

reader :: (r -> a) -> ReaderT r m a #

MonadState s m => MonadState s (ReaderT r m) 
Instance details

Defined in Control.Monad.State.Class

Methods

get :: ReaderT r m s #

put :: s -> ReaderT r m () #

state :: (s -> (a, s)) -> ReaderT r m a #

MonadError e m => MonadError e (ReaderT r m) 
Instance details

Defined in Control.Monad.Error.Class

Methods

throwError :: e -> ReaderT r m a #

catchError :: ReaderT r m a -> (e -> ReaderT r m a) -> ReaderT r m a #

MonadTrans (ReaderT r) 
Instance details

Defined in Control.Monad.Trans.Reader

Methods

lift :: Monad m => m a -> ReaderT r m a #

Monad m => Monad (ReaderT r m) 
Instance details

Defined in Control.Monad.Trans.Reader

Methods

(>>=) :: ReaderT r m a -> (a -> ReaderT r m b) -> ReaderT r m b #

(>>) :: ReaderT r m a -> ReaderT r m b -> ReaderT r m b #

return :: a -> ReaderT r m a #

Functor m => Functor (ReaderT r m) 
Instance details

Defined in Control.Monad.Trans.Reader

Methods

fmap :: (a -> b) -> ReaderT r m a -> ReaderT r m b #

(<$) :: a -> ReaderT r m b -> ReaderT r m a #

MonadFix m => MonadFix (ReaderT r m) 
Instance details

Defined in Control.Monad.Trans.Reader

Methods

mfix :: (a -> ReaderT r m a) -> ReaderT r m a #

MonadFail m => MonadFail (ReaderT r m) 
Instance details

Defined in Control.Monad.Trans.Reader

Methods

fail :: String -> ReaderT r m a #

Applicative m => Applicative (ReaderT r m) 
Instance details

Defined in Control.Monad.Trans.Reader

Methods

pure :: a -> ReaderT r m a #

(<*>) :: ReaderT r m (a -> b) -> ReaderT r m a -> ReaderT r m b #

liftA2 :: (a -> b -> c) -> ReaderT r m a -> ReaderT r m b -> ReaderT r m c #

(*>) :: ReaderT r m a -> ReaderT r m b -> ReaderT r m b #

(<*) :: ReaderT r m a -> ReaderT r m b -> ReaderT r m a #

Contravariant m => Contravariant (ReaderT r m) 
Instance details

Defined in Control.Monad.Trans.Reader

Methods

contramap :: (a -> b) -> ReaderT r m b -> ReaderT r m a #

(>$) :: b -> ReaderT r m b -> ReaderT r m a #

Representable m => Representable (ReaderT e m) 
Instance details

Defined in Data.Functor.Rep

Associated Types

type Rep (ReaderT e m) #

Methods

tabulate :: (Rep (ReaderT e m) -> a) -> ReaderT e m a #

index :: ReaderT e m a -> Rep (ReaderT e m) -> a #

Alternative m => Alternative (ReaderT r m) 
Instance details

Defined in Control.Monad.Trans.Reader

Methods

empty :: ReaderT r m a #

(<|>) :: ReaderT r m a -> ReaderT r m a -> ReaderT r m a #

some :: ReaderT r m a -> ReaderT r m [a] #

many :: ReaderT r m a -> ReaderT r m [a] #

MonadPlus m => MonadPlus (ReaderT r m) 
Instance details

Defined in Control.Monad.Trans.Reader

Methods

mzero :: ReaderT r m a #

mplus :: ReaderT r m a -> ReaderT r m a -> ReaderT r m a #

MonadZip m => MonadZip (ReaderT r m) 
Instance details

Defined in Control.Monad.Trans.Reader

Methods

mzip :: ReaderT r m a -> ReaderT r m b -> ReaderT r m (a, b) #

mzipWith :: (a -> b -> c) -> ReaderT r m a -> ReaderT r m b -> ReaderT r m c #

munzip :: ReaderT r m (a, b) -> (ReaderT r m a, ReaderT r m b) #

MonadIO m => MonadIO (ReaderT r m) 
Instance details

Defined in Control.Monad.Trans.Reader

Methods

liftIO :: IO a -> ReaderT r m a #

MonadThrow m => MonadThrow (ReaderT r m) 
Instance details

Defined in Control.Monad.Catch

Methods

throwM :: Exception e => e -> ReaderT r m a #

MonadCatch m => MonadCatch (ReaderT r m) 
Instance details

Defined in Control.Monad.Catch

Methods

catch :: Exception e => ReaderT r m a -> (e -> ReaderT r m a) -> ReaderT r m a #

MonadMask m => MonadMask (ReaderT r m) 
Instance details

Defined in Control.Monad.Catch

Methods

mask :: ((forall a. ReaderT r m a -> ReaderT r m a) -> ReaderT r m b) -> ReaderT r m b #

uninterruptibleMask :: ((forall a. ReaderT r m a -> ReaderT r m a) -> ReaderT r m b) -> ReaderT r m b #

generalBracket :: ReaderT r m a -> (a -> ExitCase b -> ReaderT r m c) -> (a -> ReaderT r m b) -> ReaderT r m (b, c) #

PrimMonad m => PrimMonad (ReaderT r m) 
Instance details

Defined in Control.Monad.Primitive

Associated Types

type PrimState (ReaderT r m) #

Methods

primitive :: (State# (PrimState (ReaderT r m)) -> (# State# (PrimState (ReaderT r m)), a #)) -> ReaderT r m a #

Zoom m n s t => Zoom (ReaderT e m) (ReaderT e n) s t 
Instance details

Defined in Control.Lens.Zoom

Methods

zoom :: LensLike' (Zoomed (ReaderT e m) c) t s -> ReaderT e m c -> ReaderT e n c #

Monad m => Magnify (ReaderT b m) (ReaderT a m) b a 
Instance details

Defined in Control.Lens.Zoom

Methods

magnify :: ((Functor (Magnified (ReaderT b m) c), Contravariant (Magnified (ReaderT b m) c)) => LensLike' (Magnified (ReaderT b m) c) a b) -> ReaderT b m c -> ReaderT a m c #

Zoom m n s t => Zoom (ReaderT e m) (ReaderT e n) s t 
Instance details

Defined in Lens.Micro.Mtl.Internal

Methods

zoom :: LensLike' (Zoomed (ReaderT e m) c) t s -> ReaderT e m c -> ReaderT e n c #

Monad m => Magnify (ReaderT b m) (ReaderT a m) b a 
Instance details

Defined in Lens.Micro.Mtl.Internal

Methods

magnify :: LensLike' (Magnified (ReaderT b m) c) a b -> ReaderT b m c -> ReaderT a m c #

Wrapped (ReaderT r m a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (ReaderT r m a) #

Methods

_Wrapped' :: Iso' (ReaderT r m a) (Unwrapped (ReaderT r m a)) #

t ~ ReaderT s n b => Rewrapped (ReaderT r m a) t 
Instance details

Defined in Control.Lens.Wrapped

type Rep (ReaderT e m) 
Instance details

Defined in Data.Functor.Rep

type Rep (ReaderT e m) = (e, Rep m)
type Zoomed (ReaderT e m) 
Instance details

Defined in Control.Lens.Zoom

type Zoomed (ReaderT e m) = Zoomed m
type Magnified (ReaderT b m) 
Instance details

Defined in Control.Lens.Zoom

type Magnified (ReaderT b m) = Effect m
type Zoomed (ReaderT e m) 
Instance details

Defined in Lens.Micro.Mtl.Internal

type Zoomed (ReaderT e m) = Zoomed m
type Magnified (ReaderT b m) 
Instance details

Defined in Lens.Micro.Mtl.Internal

type Magnified (ReaderT b m) = Effect m
type PrimState (ReaderT r m) 
Instance details

Defined in Control.Monad.Primitive

type PrimState (ReaderT r m) = PrimState m
type Unwrapped (ReaderT r m a) 
Instance details

Defined in Control.Lens.Wrapped

type Unwrapped (ReaderT r m a) = r -> m a

preuse :: MonadState s m => Getting (First a) s a -> m (Maybe a) #

preuse is (^?) (or preview) which implicitly operates on the state – it takes the state and applies a traversal (or fold) to it to extract the 1st element the traversal points at.

preuse l = gets (preview l)

use :: MonadState s m => Getting a s a -> m a #

use is (^.) (or view) which implicitly operates on the state; for instance, if your state is a record containing a field foo, you can write

x <- use foo

to extract foo from the state. In other words, use is the same as gets, but for getters instead of functions.

The implementation of use is straightforward:

use l = gets (view l)

If you need to extract something with a fold or traversal, you need preuse.

preview :: MonadReader s m => Getting (First a) s a -> m (Maybe a) #

preview is a synonym for (^?), generalised for MonadReader (just like view, which is a synonym for (^.)).

>>> preview each [1..5]
Just 1

view :: MonadReader s m => Getting a s a -> m a #

view is a synonym for (^.), generalised for MonadReader (we are able to use it instead of (^.) since functions are instances of the MonadReader class):

>>> view _1 (1, 2)
1

When you're using Reader for config and your config type has lenses generated for it, most of the time you'll be using view instead of asks:

doSomething :: (MonadReader Config m) => m Int
doSomething = do
  thingy        <- view setting1  -- same as “asks (^. setting1)”
  anotherThingy <- view setting2
  ...

show :: forall b a. (Show a, IsString b) => a -> b #

Generalized version of show.

type family Each (c :: [k -> Constraint]) (as :: [k]) where ... #

Map several constraints over several variables.

f :: Each [Show, Read] [a, b] => a -> b -> String
=
f :: (Show a, Show b, Read a, Read b) => a -> b -> String

To specify list with single constraint / variable, don't forget to prefix it with ':

f :: Each '[Show] [a, b] => a -> b -> String

Equations

Each (c :: [k -> Constraint]) ('[] :: [k]) = () 
Each (c :: [k -> Constraint]) (h ': t :: [k]) = (c <+> h, Each c t) 

pass :: Applicative f => f () #

Shorter alias for pure ().

>>> pass :: Maybe ()
Just ()

($!) :: (a -> b) -> a -> b infixr 0 #

Stricter version of $ operator. Default Prelude defines this at the toplevel module, so we do as well.

>>> const 3 $ Prelude.undefined
3
>>> const 3 $! Prelude.undefined
*** Exception: Prelude.undefined
...

map :: Functor f => (a -> b) -> f a -> f b #

map generalized to Functor.

>>> map not (Just True)
Just False
>>> map not [True,False,True,True]
[False,True,False,False]

(<<$>>) :: (Functor f, Functor g) => (a -> b) -> f (g a) -> f (g b) infixl 4 #

Alias for fmap . fmap. Convenient to work with two nested Functors.

>>> negate <<$>> Just [1,2,3]
Just [-1,-2,-3]

newEmptyMVar :: MonadIO m => m (MVar a) #

Lifted to MonadIO version of newEmptyMVar.

newMVar :: MonadIO m => a -> m (MVar a) #

Lifted to MonadIO version of newMVar.

putMVar :: MonadIO m => MVar a -> a -> m () #

Lifted to MonadIO version of putMVar.

readMVar :: MonadIO m => MVar a -> m a #

Lifted to MonadIO version of readMVar.

swapMVar :: MonadIO m => MVar a -> a -> m a #

Lifted to MonadIO version of swapMVar.

takeMVar :: MonadIO m => MVar a -> m a #

Lifted to MonadIO version of takeMVar.

tryPutMVar :: MonadIO m => MVar a -> a -> m Bool #

Lifted to MonadIO version of tryPutMVar.

tryReadMVar :: MonadIO m => MVar a -> m (Maybe a) #

Lifted to MonadIO version of tryReadMVar.

tryTakeMVar :: MonadIO m => MVar a -> m (Maybe a) #

Lifted to MonadIO version of tryTakeMVar.

atomically :: MonadIO m => STM a -> m a #

Lifted to MonadIO version of atomically.

newTVarIO :: MonadIO m => a -> m (TVar a) #

Lifted to MonadIO version of newTVarIO.

readTVarIO :: MonadIO m => TVar a -> m a #

Lifted to MonadIO version of readTVarIO.

exitWith :: MonadIO m => ExitCode -> m a #

Lifted version of exitWith.

exitFailure :: MonadIO m => m a #

Lifted version of exitFailure.

exitSuccess :: MonadIO m => m a #

Lifted version of exitSuccess.

die :: MonadIO m => String -> m a #

Lifted version of die. die is available since base-4.8, but it's more convenient to redefine it instead of using CPP.

appendFile :: MonadIO m => FilePath -> Text -> m () #

Lifted version of appendFile.

getLine :: MonadIO m => m Text #

Lifted version of getLine.

openFile :: MonadIO m => FilePath -> IOMode -> m Handle #

Lifted version of openFile.

See also withFile for more information.

hClose :: MonadIO m => Handle -> m () #

Close a file handle

See also withFile for more information.

withFile :: (MonadIO m, MonadMask m) => FilePath -> IOMode -> (Handle -> m a) -> m a #

Opens a file, manipulates it with the provided function and closes the handle before returning. The Handle can be written to using the hPutStr and hPutStrLn functions.

withFile is essentially the bracket pattern, specialized to files. This should be preferred over openFile + hClose as it properly deals with (asynchronous) exceptions. In cases where withFile is insufficient, for instance because the it is not statically known when manipulating the Handle has finished, one should consider other safe paradigms for resource usage, such as the ResourceT transformer from the resourcet package, before resorting to openFile and hClose.

newIORef :: MonadIO m => a -> m (IORef a) #

Lifted version of newIORef.

readIORef :: MonadIO m => IORef a -> m a #

Lifted version of readIORef.

writeIORef :: MonadIO m => IORef a -> a -> m () #

Lifted version of writeIORef.

modifyIORef :: MonadIO m => IORef a -> (a -> a) -> m () #

Lifted version of modifyIORef.

modifyIORef' :: MonadIO m => IORef a -> (a -> a) -> m () #

Lifted version of modifyIORef'.

atomicModifyIORef :: MonadIO m => IORef a -> (a -> (a, b)) -> m b #

Lifted version of atomicModifyIORef.

atomicModifyIORef' :: MonadIO m => IORef a -> (a -> (a, b)) -> m b #

Lifted version of atomicModifyIORef'.

atomicWriteIORef :: MonadIO m => IORef a -> a -> m () #

Lifted version of atomicWriteIORef.

whenJust :: Applicative f => Maybe a -> (a -> f ()) -> f () #

Specialized version of for_ for Maybe. It's used for code readability. Also helps to avoid space leaks: Foldable.mapM_ space leak.

>>> whenJust Nothing $ \b -> print (not b)
>>> whenJust (Just True) $ \b -> print (not b)
False

whenJustM :: Monad m => m (Maybe a) -> (a -> m ()) -> m () #

Monadic version of whenJust.

whenNothing :: Applicative f => Maybe a -> f a -> f a #

Performs default Applicative action if Nothing is given. Otherwise returns content of Just pured to Applicative.

>>> whenNothing Nothing [True, False]
[True,False]
>>> whenNothing (Just True) [True, False]
[True]

whenNothing_ :: Applicative f => Maybe a -> f () -> f () #

Performs default Applicative action if Nothing is given. Do nothing for Just. Convenient for discarding Just content.

>>> whenNothing_ Nothing $ putTextLn "Nothing!"
Nothing!
>>> whenNothing_ (Just True) $ putTextLn "Nothing!"

whenNothingM :: Monad m => m (Maybe a) -> m a -> m a #

Monadic version of whenNothing.

whenNothingM_ :: Monad m => m (Maybe a) -> m () -> m () #

Monadic version of whenNothingM_.

fromLeft :: a -> Either a b -> a #

Extracts value from Left or return given default value.

>>> fromLeft 0 (Left 3)
3
>>> fromLeft 0 (Right 5)
0

fromRight :: b -> Either a b -> b #

Extracts value from Right or return given default value.

>>> fromRight 0 (Left 3)
0
>>> fromRight 0 (Right 5)
5

leftToMaybe :: Either l r -> Maybe l #

Maps left part of Either to Maybe.

>>> leftToMaybe (Left True)
Just True
>>> leftToMaybe (Right "aba")
Nothing

rightToMaybe :: Either l r -> Maybe r #

Maps right part of Either to Maybe.

>>> rightToMaybe (Left True)
Nothing
>>> rightToMaybe (Right "aba")
Just "aba"

maybeToRight :: l -> Maybe r -> Either l r #

Maps Maybe to Either wrapping default value into Left.

>>> maybeToRight True (Just "aba")
Right "aba"
>>> maybeToRight True Nothing
Left True

maybeToLeft :: r -> Maybe l -> Either l r #

Maps Maybe to Either wrapping default value into Right.

>>> maybeToLeft True (Just "aba")
Left "aba"
>>> maybeToLeft True Nothing
Right True

whenLeftM :: Monad m => m (Either l r) -> (l -> m ()) -> m () #

Monadic version of whenLeft.

whenRightM :: Monad m => m (Either l r) -> (r -> m ()) -> m () #

Monadic version of whenRight.

usingReaderT :: r -> ReaderT r m a -> m a #

Shorter and more readable alias for flip runReaderT.

usingReader :: r -> Reader r a -> a #

Shorter and more readable alias for flip runReader.

usingStateT :: s -> StateT s m a -> m (a, s) #

Shorter and more readable alias for flip runStateT.

usingState :: s -> State s a -> (a, s) #

Shorter and more readable alias for flip runState.

evaluatingStateT :: Functor f => s -> StateT s f a -> f a #

Alias for flip evalStateT. It's not shorter but sometimes more readable. Done by analogy with using* functions family.

evaluatingState :: s -> State s a -> a #

Alias for flip evalState. It's not shorter but sometimes more readable. Done by analogy with using* functions family.

executingStateT :: Functor f => s -> StateT s f a -> f s #

Alias for flip execStateT. It's not shorter but sometimes more readable. Done by analogy with using* functions family.

executingState :: s -> State s a -> s #

Alias for flip execState. It's not shorter but sometimes more readable. Done by analogy with using* functions family.

maybeToMonoid :: Monoid m => Maybe m -> m #

Extracts Monoid value from Maybe returning mempty if Nothing.

>>> maybeToMonoid (Just [1,2,3] :: Maybe [Int])
[1,2,3]
>>> maybeToMonoid (Nothing :: Maybe [Int])
[]

class One x where #

Type class for types that can be created from one element. singleton is lone name for this function. Also constructions of different type differ: :[] for lists, two arguments for Maps. Also some data types are monomorphic.

>>> one True :: [Bool]
[True]
>>> one 'a' :: Text
"a"
>>> one (3, "hello") :: HashMap Int String
fromList [(3,"hello")]

Associated Types

type OneItem x #

Methods

one :: OneItem x -> x #

Create a list, map, Text, etc from a single element.

Instances

Instances details
One ByteString 
Instance details

Defined in Universum.Container.Class

Associated Types

type OneItem ByteString #

One ByteString 
Instance details

Defined in Universum.Container.Class

Associated Types

type OneItem ByteString #

One Text 
Instance details

Defined in Universum.Container.Class

Associated Types

type OneItem Text #

Methods

one :: OneItem Text -> Text #

One Text 
Instance details

Defined in Universum.Container.Class

Associated Types

type OneItem Text #

Methods

one :: OneItem Text -> Text #

One IntSet 
Instance details

Defined in Universum.Container.Class

Associated Types

type OneItem IntSet #

Methods

one :: OneItem IntSet -> IntSet #

One [a] 
Instance details

Defined in Universum.Container.Class

Associated Types

type OneItem [a] #

Methods

one :: OneItem [a] -> [a] #

One (NonEmpty a) 
Instance details

Defined in Universum.Container.Class

Associated Types

type OneItem (NonEmpty a) #

Methods

one :: OneItem (NonEmpty a) -> NonEmpty a #

One (IntMap v) 
Instance details

Defined in Universum.Container.Class

Associated Types

type OneItem (IntMap v) #

Methods

one :: OneItem (IntMap v) -> IntMap v #

One (Seq a) 
Instance details

Defined in Universum.Container.Class

Associated Types

type OneItem (Seq a) #

Methods

one :: OneItem (Seq a) -> Seq a #

One (Set v) 
Instance details

Defined in Universum.Container.Class

Associated Types

type OneItem (Set v) #

Methods

one :: OneItem (Set v) -> Set v #

Prim a => One (Vector a) 
Instance details

Defined in Universum.Container.Class

Associated Types

type OneItem (Vector a) #

Methods

one :: OneItem (Vector a) -> Vector a #

Storable a => One (Vector a) 
Instance details

Defined in Universum.Container.Class

Associated Types

type OneItem (Vector a) #

Methods

one :: OneItem (Vector a) -> Vector a #

Unbox a => One (Vector a) 
Instance details

Defined in Universum.Container.Class

Associated Types

type OneItem (Vector a) #

Methods

one :: OneItem (Vector a) -> Vector a #

Hashable v => One (HashSet v) 
Instance details

Defined in Universum.Container.Class

Associated Types

type OneItem (HashSet v) #

Methods

one :: OneItem (HashSet v) -> HashSet v #

One (Vector a) 
Instance details

Defined in Universum.Container.Class

Associated Types

type OneItem (Vector a) #

Methods

one :: OneItem (Vector a) -> Vector a #

Hashable k => One (HashMap k v) 
Instance details

Defined in Universum.Container.Class

Associated Types

type OneItem (HashMap k v) #

Methods

one :: OneItem (HashMap k v) -> HashMap k v #

One (Map k v) 
Instance details

Defined in Universum.Container.Class

Associated Types

type OneItem (Map k v) #

Methods

one :: OneItem (Map k v) -> Map k v #

type family OneItem x #

Instances

Instances details
type OneItem ByteString 
Instance details

Defined in Universum.Container.Class

type OneItem ByteString 
Instance details

Defined in Universum.Container.Class

type OneItem Text 
Instance details

Defined in Universum.Container.Class

type OneItem Text 
Instance details

Defined in Universum.Container.Class

type OneItem IntSet 
Instance details

Defined in Universum.Container.Class

type OneItem [a] 
Instance details

Defined in Universum.Container.Class

type OneItem [a] = a
type OneItem (NonEmpty a) 
Instance details

Defined in Universum.Container.Class

type OneItem (NonEmpty a) = a
type OneItem (IntMap v) 
Instance details

Defined in Universum.Container.Class

type OneItem (IntMap v) = (Int, v)
type OneItem (Seq a) 
Instance details

Defined in Universum.Container.Class

type OneItem (Seq a) = a
type OneItem (Set v) 
Instance details

Defined in Universum.Container.Class

type OneItem (Set v) = v
type OneItem (Vector a) 
Instance details

Defined in Universum.Container.Class

type OneItem (Vector a) = a
type OneItem (Vector a) 
Instance details

Defined in Universum.Container.Class

type OneItem (Vector a) = a
type OneItem (Vector a) 
Instance details

Defined in Universum.Container.Class

type OneItem (Vector a) = a
type OneItem (HashSet v) 
Instance details

Defined in Universum.Container.Class

type OneItem (HashSet v) = v
type OneItem (Vector a) 
Instance details

Defined in Universum.Container.Class

type OneItem (Vector a) = a
type OneItem (HashMap k v) 
Instance details

Defined in Universum.Container.Class

type OneItem (HashMap k v) = (k, v)
type OneItem (Map k v) 
Instance details

Defined in Universum.Container.Class

type OneItem (Map k v) = (k, v)

class Container t where #

Very similar to Foldable but also allows instances for monomorphic types like Text but forbids instances for Maybe and similar. This class is used as a replacement for Foldable type class. It solves the following problems:

  1. length, foldr and other functions work on more types for which it makes sense.
  2. You can't accidentally use length on polymorphic Foldable (like list), replace list with Maybe and then debug error for two days.
  3. More efficient implementaions of functions for polymorphic types (like elem for Set).

The drawbacks:

  1. Type signatures of polymorphic functions look more scary.
  2. Orphan instances are involved if you want to use foldr (and similar) on types from libraries.

Minimal complete definition

Nothing

Associated Types

type Element t #

Type of element for some container. Implemented as an asscociated type family because some containers are monomorphic over element type (like Text, IntSet, etc.) so we can't implement nice interface using old higher-kinded types approach. Implementing this as an associated type family instead of top-level family gives you more control over element types.

type Element t = ElementDefault t #

Methods

toList :: t -> [Element t] #

Convert container to list of elements.

>>> toList @Text "aba"
"aba"
>>> :t toList @Text "aba"
toList @Text "aba" :: [Char]

null :: t -> Bool #

Checks whether container is empty.

>>> null @Text ""
True
>>> null @Text "aba"
False

foldr :: (Element t -> b -> b) -> b -> t -> b #

foldl :: (b -> Element t -> b) -> b -> t -> b #

foldl' :: (b -> Element t -> b) -> b -> t -> b #

length :: t -> Int #

elem :: Element t -> t -> Bool #

maximum :: t -> Element t #

minimum :: t -> Element t #

foldMap :: Monoid m => (Element t -> m) -> t -> m #

fold :: t -> Element t #

foldr' :: (Element t -> b -> b) -> b -> t -> b #

foldr1 :: (Element t -> Element t -> Element t) -> t -> Element t #

foldl1 :: (Element t -> Element t -> Element t) -> t -> Element t #

notElem :: Element t -> t -> Bool #

all :: (Element t -> Bool) -> t -> Bool #

any :: (Element t -> Bool) -> t -> Bool #

find :: (Element t -> Bool) -> t -> Maybe (Element t) #

safeHead :: t -> Maybe (Element t) #

Instances

Instances details
Container ByteString 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element ByteString #

Container ByteString 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element ByteString #

Container Text 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element Text #

Methods

toList :: Text -> [Element Text] #

null :: Text -> Bool #

foldr :: (Element Text -> b -> b) -> b -> Text -> b #

foldl :: (b -> Element Text -> b) -> b -> Text -> b #

foldl' :: (b -> Element Text -> b) -> b -> Text -> b #

length :: Text -> Int #

elem :: Element Text -> Text -> Bool #

maximum :: Text -> Element Text #

minimum :: Text -> Element Text #

foldMap :: Monoid m => (Element Text -> m) -> Text -> m #

fold :: Text -> Element Text #

foldr' :: (Element Text -> b -> b) -> b -> Text -> b #

foldr1 :: (Element Text -> Element Text -> Element Text) -> Text -> Element Text #

foldl1 :: (Element Text -> Element Text -> Element Text) -> Text -> Element Text #

notElem :: Element Text -> Text -> Bool #

all :: (Element Text -> Bool) -> Text -> Bool #

any :: (Element Text -> Bool) -> Text -> Bool #

and :: Text -> Bool #

or :: Text -> Bool #

find :: (Element Text -> Bool) -> Text -> Maybe (Element Text) #

safeHead :: Text -> Maybe (Element Text) #

Container Text 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element Text #

Methods

toList :: Text -> [Element Text] #

null :: Text -> Bool #

foldr :: (Element Text -> b -> b) -> b -> Text -> b #

foldl :: (b -> Element Text -> b) -> b -> Text -> b #

foldl' :: (b -> Element Text -> b) -> b -> Text -> b #

length :: Text -> Int #

elem :: Element Text -> Text -> Bool #

maximum :: Text -> Element Text #

minimum :: Text -> Element Text #

foldMap :: Monoid m => (Element Text -> m) -> Text -> m #

fold :: Text -> Element Text #

foldr' :: (Element Text -> b -> b) -> b -> Text -> b #

foldr1 :: (Element Text -> Element Text -> Element Text) -> Text -> Element Text #

foldl1 :: (Element Text -> Element Text -> Element Text) -> Text -> Element Text #

notElem :: Element Text -> Text -> Bool #

all :: (Element Text -> Bool) -> Text -> Bool #

any :: (Element Text -> Bool) -> Text -> Bool #

and :: Text -> Bool #

or :: Text -> Bool #

find :: (Element Text -> Bool) -> Text -> Maybe (Element Text) #

safeHead :: Text -> Maybe (Element Text) #

Container IntSet 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element IntSet #

Container MText 
Instance details

Defined in Michelson.Text

Associated Types

type Element MText #

Methods

toList :: MText -> [Element MText] #

null :: MText -> Bool #

foldr :: (Element MText -> b -> b) -> b -> MText -> b #

foldl :: (b -> Element MText -> b) -> b -> MText -> b #

foldl' :: (b -> Element MText -> b) -> b -> MText -> b #

length :: MText -> Int #

elem :: Element MText -> MText -> Bool #

maximum :: MText -> Element MText #

minimum :: MText -> Element MText #

foldMap :: Monoid m => (Element MText -> m) -> MText -> m #

fold :: MText -> Element MText #

foldr' :: (Element MText -> b -> b) -> b -> MText -> b #

foldr1 :: (Element MText -> Element MText -> Element MText) -> MText -> Element MText #

foldl1 :: (Element MText -> Element MText -> Element MText) -> MText -> Element MText #

notElem :: Element MText -> MText -> Bool #

all :: (Element MText -> Bool) -> MText -> Bool #

any :: (Element MText -> Bool) -> MText -> Bool #

and :: MText -> Bool #

or :: MText -> Bool #

find :: (Element MText -> Bool) -> MText -> Maybe (Element MText) #

safeHead :: MText -> Maybe (Element MText) #

Container [a] 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element [a] #

Methods

toList :: [a] -> [Element [a]] #

null :: [a] -> Bool #

foldr :: (Element [a] -> b -> b) -> b -> [a] -> b #

foldl :: (b -> Element [a] -> b) -> b -> [a] -> b #

foldl' :: (b -> Element [a] -> b) -> b -> [a] -> b #

length :: [a] -> Int #

elem :: Element [a] -> [a] -> Bool #

maximum :: [a] -> Element [a] #

minimum :: [a] -> Element [a] #

foldMap :: Monoid m => (Element [a] -> m) -> [a] -> m #

fold :: [a] -> Element [a] #

foldr' :: (Element [a] -> b -> b) -> b -> [a] -> b #

foldr1 :: (Element [a] -> Element [a] -> Element [a]) -> [a] -> Element [a] #

foldl1 :: (Element [a] -> Element [a] -> Element [a]) -> [a] -> Element [a] #

notElem :: Element [a] -> [a] -> Bool #

all :: (Element [a] -> Bool) -> [a] -> Bool #

any :: (Element [a] -> Bool) -> [a] -> Bool #

and :: [a] -> Bool #

or :: [a] -> Bool #

find :: (Element [a] -> Bool) -> [a] -> Maybe (Element [a]) #

safeHead :: [a] -> Maybe (Element [a]) #

(TypeError (DisallowInstance "Maybe") :: Constraint) => Container (Maybe a) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element (Maybe a) #

Methods

toList :: Maybe a -> [Element (Maybe a)] #

null :: Maybe a -> Bool #

foldr :: (Element (Maybe a) -> b -> b) -> b -> Maybe a -> b #

foldl :: (b -> Element (Maybe a) -> b) -> b -> Maybe a -> b #

foldl' :: (b -> Element (Maybe a) -> b) -> b -> Maybe a -> b #

length :: Maybe a -> Int #

elem :: Element (Maybe a) -> Maybe a -> Bool #

maximum :: Maybe a -> Element (Maybe a) #

minimum :: Maybe a -> Element (Maybe a) #

foldMap :: Monoid m => (Element (Maybe a) -> m) -> Maybe a -> m #

fold :: Maybe a -> Element (Maybe a) #

foldr' :: (Element (Maybe a) -> b -> b) -> b -> Maybe a -> b #

foldr1 :: (Element (Maybe a) -> Element (Maybe a) -> Element (Maybe a)) -> Maybe a -> Element (Maybe a) #

foldl1 :: (Element (Maybe a) -> Element (Maybe a) -> Element (Maybe a)) -> Maybe a -> Element (Maybe a) #

notElem :: Element (Maybe a) -> Maybe a -> Bool #

all :: (Element (Maybe a) -> Bool) -> Maybe a -> Bool #

any :: (Element (Maybe a) -> Bool) -> Maybe a -> Bool #

and :: Maybe a -> Bool #

or :: Maybe a -> Bool #

find :: (Element (Maybe a) -> Bool) -> Maybe a -> Maybe (Element (Maybe a)) #

safeHead :: Maybe a -> Maybe (Element (Maybe a)) #

Container (ZipList a) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element (ZipList a) #

Methods

toList :: ZipList a -> [Element (ZipList a)] #

null :: ZipList a -> Bool #

foldr :: (Element (ZipList a) -> b -> b) -> b -> ZipList a -> b #

foldl :: (b -> Element (ZipList a) -> b) -> b -> ZipList a -> b #

foldl' :: (b -> Element (ZipList a) -> b) -> b -> ZipList a -> b #

length :: ZipList a -> Int #

elem :: Element (ZipList a) -> ZipList a -> Bool #

maximum :: ZipList a -> Element (ZipList a) #

minimum :: ZipList a -> Element (ZipList a) #

foldMap :: Monoid m => (Element (ZipList a) -> m) -> ZipList a -> m #

fold :: ZipList a -> Element (ZipList a) #

foldr' :: (Element (ZipList a) -> b -> b) -> b -> ZipList a -> b #

foldr1 :: (Element (ZipList a) -> Element (ZipList a) -> Element (ZipList a)) -> ZipList a -> Element (ZipList a) #

foldl1 :: (Element (ZipList a) -> Element (ZipList a) -> Element (ZipList a)) -> ZipList a -> Element (ZipList a) #

notElem :: Element (ZipList a) -> ZipList a -> Bool #

all :: (Element (ZipList a) -> Bool) -> ZipList a -> Bool #

any :: (Element (ZipList a) -> Bool) -> ZipList a -> Bool #

and :: ZipList a -> Bool #

or :: ZipList a -> Bool #

find :: (Element (ZipList a) -> Bool) -> ZipList a -> Maybe (Element (ZipList a)) #

safeHead :: ZipList a -> Maybe (Element (ZipList a)) #

(TypeError (DisallowInstance "Identity") :: Constraint) => Container (Identity a) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element (Identity a) #

Methods

toList :: Identity a -> [Element (Identity a)] #

null :: Identity a -> Bool #

foldr :: (Element (Identity a) -> b -> b) -> b -> Identity a -> b #

foldl :: (b -> Element (Identity a) -> b) -> b -> Identity a -> b #

foldl' :: (b -> Element (Identity a) -> b) -> b -> Identity a -> b #

length :: Identity a -> Int #

elem :: Element (Identity a) -> Identity a -> Bool #

maximum :: Identity a -> Element (Identity a) #

minimum :: Identity a -> Element (Identity a) #

foldMap :: Monoid m => (Element (Identity a) -> m) -> Identity a -> m #

fold :: Identity a -> Element (Identity a) #

foldr' :: (Element (Identity a) -> b -> b) -> b -> Identity a -> b #

foldr1 :: (Element (Identity a) -> Element (Identity a) -> Element (Identity a)) -> Identity a -> Element (Identity a) #

foldl1 :: (Element (Identity a) -> Element (Identity a) -> Element (Identity a)) -> Identity a -> Element (Identity a) #

notElem :: Element (Identity a) -> Identity a -> Bool #

all :: (Element (Identity a) -> Bool) -> Identity a -> Bool #

any :: (Element (Identity a) -> Bool) -> Identity a -> Bool #

and :: Identity a -> Bool #

or :: Identity a -> Bool #

find :: (Element (Identity a) -> Bool) -> Identity a -> Maybe (Element (Identity a)) #

safeHead :: Identity a -> Maybe (Element (Identity a)) #

Container (First a) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element (First a) #

Methods

toList :: First a -> [Element (First a)] #

null :: First a -> Bool #

foldr :: (Element (First a) -> b -> b) -> b -> First a -> b #

foldl :: (b -> Element (First a) -> b) -> b -> First a -> b #

foldl' :: (b -> Element (First a) -> b) -> b -> First a -> b #

length :: First a -> Int #

elem :: Element (First a) -> First a -> Bool #

maximum :: First a -> Element (First a) #

minimum :: First a -> Element (First a) #

foldMap :: Monoid m => (Element (First a) -> m) -> First a -> m #

fold :: First a -> Element (First a) #

foldr' :: (Element (First a) -> b -> b) -> b -> First a -> b #

foldr1 :: (Element (First a) -> Element (First a) -> Element (First a)) -> First a -> Element (First a) #

foldl1 :: (Element (First a) -> Element (First a) -> Element (First a)) -> First a -> Element (First a) #

notElem :: Element (First a) -> First a -> Bool #

all :: (Element (First a) -> Bool) -> First a -> Bool #

any :: (Element (First a) -> Bool) -> First a -> Bool #

and :: First a -> Bool #

or :: First a -> Bool #

find :: (Element (First a) -> Bool) -> First a -> Maybe (Element (First a)) #

safeHead :: First a -> Maybe (Element (First a)) #

Container (Last a) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element (Last a) #

Methods

toList :: Last a -> [Element (Last a)] #

null :: Last a -> Bool #

foldr :: (Element (Last a) -> b -> b) -> b -> Last a -> b #

foldl :: (b -> Element (Last a) -> b) -> b -> Last a -> b #

foldl' :: (b -> Element (Last a) -> b) -> b -> Last a -> b #

length :: Last a -> Int #

elem :: Element (Last a) -> Last a -> Bool #

maximum :: Last a -> Element (Last a) #

minimum :: Last a -> Element (Last a) #

foldMap :: Monoid m => (Element (Last a) -> m) -> Last a -> m #

fold :: Last a -> Element (Last a) #

foldr' :: (Element (Last a) -> b -> b) -> b -> Last a -> b #

foldr1 :: (Element (Last a) -> Element (Last a) -> Element (Last a)) -> Last a -> Element (Last a) #

foldl1 :: (Element (Last a) -> Element (Last a) -> Element (Last a)) -> Last a -> Element (Last a) #

notElem :: Element (Last a) -> Last a -> Bool #

all :: (Element (Last a) -> Bool) -> Last a -> Bool #

any :: (Element (Last a) -> Bool) -> Last a -> Bool #

and :: Last a -> Bool #

or :: Last a -> Bool #

find :: (Element (Last a) -> Bool) -> Last a -> Maybe (Element (Last a)) #

safeHead :: Last a -> Maybe (Element (Last a)) #

Container (Dual a) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element (Dual a) #

Methods

toList :: Dual a -> [Element (Dual a)] #

null :: Dual a -> Bool #

foldr :: (Element (Dual a) -> b -> b) -> b -> Dual a -> b #

foldl :: (b -> Element (Dual a) -> b) -> b -> Dual a -> b #

foldl' :: (b -> Element (Dual a) -> b) -> b -> Dual a -> b #

length :: Dual a -> Int #

elem :: Element (Dual a) -> Dual a -> Bool #

maximum :: Dual a -> Element (Dual a) #

minimum :: Dual a -> Element (Dual a) #

foldMap :: Monoid m => (Element (Dual a) -> m) -> Dual a -> m #

fold :: Dual a -> Element (Dual a) #

foldr' :: (Element (Dual a) -> b -> b) -> b -> Dual a -> b #

foldr1 :: (Element (Dual a) -> Element (Dual a) -> Element (Dual a)) -> Dual a -> Element (Dual a) #

foldl1 :: (Element (Dual a) -> Element (Dual a) -> Element (Dual a)) -> Dual a -> Element (Dual a) #

notElem :: Element (Dual a) -> Dual a -> Bool #

all :: (Element (Dual a) -> Bool) -> Dual a -> Bool #

any :: (Element (Dual a) -> Bool) -> Dual a -> Bool #

and :: Dual a -> Bool #

or :: Dual a -> Bool #

find :: (Element (Dual a) -> Bool) -> Dual a -> Maybe (Element (Dual a)) #

safeHead :: Dual a -> Maybe (Element (Dual a)) #

Container (Sum a) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element (Sum a) #

Methods

toList :: Sum a -> [Element (Sum a)] #

null :: Sum a -> Bool #

foldr :: (Element (Sum a) -> b -> b) -> b -> Sum a -> b #

foldl :: (b -> Element (Sum a) -> b) -> b -> Sum a -> b #

foldl' :: (b -> Element (Sum a) -> b) -> b -> Sum a -> b #

length :: Sum a -> Int #

elem :: Element (Sum a) -> Sum a -> Bool #

maximum :: Sum a -> Element (Sum a) #

minimum :: Sum a -> Element (Sum a) #

foldMap :: Monoid m => (Element (Sum a) -> m) -> Sum a -> m #

fold :: Sum a -> Element (Sum a) #

foldr' :: (Element (Sum a) -> b -> b) -> b -> Sum a -> b #

foldr1 :: (Element (Sum a) -> Element (Sum a) -> Element (Sum a)) -> Sum a -> Element (Sum a) #

foldl1 :: (Element (Sum a) -> Element (Sum a) -> Element (Sum a)) -> Sum a -> Element (Sum a) #

notElem :: Element (Sum a) -> Sum a -> Bool #

all :: (Element (Sum a) -> Bool) -> Sum a -> Bool #

any :: (Element (Sum a) -> Bool) -> Sum a -> Bool #

and :: Sum a -> Bool #

or :: Sum a -> Bool #

find :: (Element (Sum a) -> Bool) -> Sum a -> Maybe (Element (Sum a)) #

safeHead :: Sum a -> Maybe (Element (Sum a)) #

Container (Product a) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element (Product a) #

Methods

toList :: Product a -> [Element (Product a)] #

null :: Product a -> Bool #

foldr :: (Element (Product a) -> b -> b) -> b -> Product a -> b #

foldl :: (b -> Element (Product a) -> b) -> b -> Product a -> b #

foldl' :: (b -> Element (Product a) -> b) -> b -> Product a -> b #

length :: Product a -> Int #

elem :: Element (Product a) -> Product a -> Bool #

maximum :: Product a -> Element (Product a) #

minimum :: Product a -> Element (Product a) #

foldMap :: Monoid m => (Element (Product a) -> m) -> Product a -> m #

fold :: Product a -> Element (Product a) #

foldr' :: (Element (Product a) -> b -> b) -> b -> Product a -> b #

foldr1 :: (Element (Product a) -> Element (Product a) -> Element (Product a)) -> Product a -> Element (Product a) #

foldl1 :: (Element (Product a) -> Element (Product a) -> Element (Product a)) -> Product a -> Element (Product a) #

notElem :: Element (Product a) -> Product a -> Bool #

all :: (Element (Product a) -> Bool) -> Product a -> Bool #

any :: (Element (Product a) -> Bool) -> Product a -> Bool #

and :: Product a -> Bool #

or :: Product a -> Bool #

find :: (Element (Product a) -> Bool) -> Product a -> Maybe (Element (Product a)) #

safeHead :: Product a -> Maybe (Element (Product a)) #

Container (NonEmpty a) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element (NonEmpty a) #

Methods

toList :: NonEmpty a -> [Element (NonEmpty a)] #

null :: NonEmpty a -> Bool #

foldr :: (Element (NonEmpty a) -> b -> b) -> b -> NonEmpty a -> b #

foldl :: (b -> Element (NonEmpty a) -> b) -> b -> NonEmpty a -> b #

foldl' :: (b -> Element (NonEmpty a) -> b) -> b -> NonEmpty a -> b #

length :: NonEmpty a -> Int #

elem :: Element (NonEmpty a) -> NonEmpty a -> Bool #

maximum :: NonEmpty a -> Element (NonEmpty a) #

minimum :: NonEmpty a -> Element (NonEmpty a) #

foldMap :: Monoid m => (Element (NonEmpty a) -> m) -> NonEmpty a -> m #

fold :: NonEmpty a -> Element (NonEmpty a) #

foldr' :: (Element (NonEmpty a) -> b -> b) -> b -> NonEmpty a -> b #

foldr1 :: (Element (NonEmpty a) -> Element (NonEmpty a) -> Element (NonEmpty a)) -> NonEmpty a -> Element (NonEmpty a) #

foldl1 :: (Element (NonEmpty a) -> Element (NonEmpty a) -> Element (NonEmpty a)) -> NonEmpty a -> Element (NonEmpty a) #

notElem :: Element (NonEmpty a) -> NonEmpty a -> Bool #

all :: (Element (NonEmpty a) -> Bool) -> NonEmpty a -> Bool #

any :: (Element (NonEmpty a) -> Bool) -> NonEmpty a -> Bool #

and :: NonEmpty a -> Bool #

or :: NonEmpty a -> Bool #

find :: (Element (NonEmpty a) -> Bool) -> NonEmpty a -> Maybe (Element (NonEmpty a)) #

safeHead :: NonEmpty a -> Maybe (Element (NonEmpty a)) #

Container (IntMap v) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element (IntMap v) #

Methods

toList :: IntMap v -> [Element (IntMap v)] #

null :: IntMap v -> Bool #

foldr :: (Element (IntMap v) -> b -> b) -> b -> IntMap v -> b #

foldl :: (b -> Element (IntMap v) -> b) -> b -> IntMap v -> b #

foldl' :: (b -> Element (IntMap v) -> b) -> b -> IntMap v -> b #

length :: IntMap v -> Int #

elem :: Element (IntMap v) -> IntMap v -> Bool #

maximum :: IntMap v -> Element (IntMap v) #

minimum :: IntMap v -> Element (IntMap v) #

foldMap :: Monoid m => (Element (IntMap v) -> m) -> IntMap v -> m #

fold :: IntMap v -> Element (IntMap v) #

foldr' :: (Element (IntMap v) -> b -> b) -> b -> IntMap v -> b #

foldr1 :: (Element (IntMap v) -> Element (IntMap v) -> Element (IntMap v)) -> IntMap v -> Element (IntMap v) #

foldl1 :: (Element (IntMap v) -> Element (IntMap v) -> Element (IntMap v)) -> IntMap v -> Element (IntMap v) #

notElem :: Element (IntMap v) -> IntMap v -> Bool #

all :: (Element (IntMap v) -> Bool) -> IntMap v -> Bool #

any :: (Element (IntMap v) -> Bool) -> IntMap v -> Bool #

and :: IntMap v -> Bool #

or :: IntMap v -> Bool #

find :: (Element (IntMap v) -> Bool) -> IntMap v -> Maybe (Element (IntMap v)) #

safeHead :: IntMap v -> Maybe (Element (IntMap v)) #

Container (Seq a) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element (Seq a) #

Methods

toList :: Seq a -> [Element (Seq a)] #

null :: Seq a -> Bool #

foldr :: (Element (Seq a) -> b -> b) -> b -> Seq a -> b #

foldl :: (b -> Element (Seq a) -> b) -> b -> Seq a -> b #

foldl' :: (b -> Element (Seq a) -> b) -> b -> Seq a -> b #

length :: Seq a -> Int #

elem :: Element (Seq a) -> Seq a -> Bool #

maximum :: Seq a -> Element (Seq a) #

minimum :: Seq a -> Element (Seq a) #

foldMap :: Monoid m => (Element (Seq a) -> m) -> Seq a -> m #

fold :: Seq a -> Element (Seq a) #

foldr' :: (Element (Seq a) -> b -> b) -> b -> Seq a -> b #

foldr1 :: (Element (Seq a) -> Element (Seq a) -> Element (Seq a)) -> Seq a -> Element (Seq a) #

foldl1 :: (Element (Seq a) -> Element (Seq a) -> Element (Seq a)) -> Seq a -> Element (Seq a) #

notElem :: Element (Seq a) -> Seq a -> Bool #

all :: (Element (Seq a) -> Bool) -> Seq a -> Bool #

any :: (Element (Seq a) -> Bool) -> Seq a -> Bool #

and :: Seq a -> Bool #

or :: Seq a -> Bool #

find :: (Element (Seq a) -> Bool) -> Seq a -> Maybe (Element (Seq a)) #

safeHead :: Seq a -> Maybe (Element (Seq a)) #

Ord v => Container (Set v) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element (Set v) #

Methods

toList :: Set v -> [Element (Set v)] #

null :: Set v -> Bool #

foldr :: (Element (Set v) -> b -> b) -> b -> Set v -> b #

foldl :: (b -> Element (Set v) -> b) -> b -> Set v -> b #

foldl' :: (b -> Element (Set v) -> b) -> b -> Set v -> b #

length :: Set v -> Int #

elem :: Element (Set v) -> Set v -> Bool #

maximum :: Set v -> Element (Set v) #

minimum :: Set v -> Element (Set v) #

foldMap :: Monoid m => (Element (Set v) -> m) -> Set v -> m #

fold :: Set v -> Element (Set v) #

foldr' :: (Element (Set v) -> b -> b) -> b -> Set v -> b #

foldr1 :: (Element (Set v) -> Element (Set v) -> Element (Set v)) -> Set v -> Element (Set v) #

foldl1 :: (Element (Set v) -> Element (Set v) -> Element (Set v)) -> Set v -> Element (Set v) #

notElem :: Element (Set v) -> Set v -> Bool #

all :: (Element (Set v) -> Bool) -> Set v -> Bool #

any :: (Element (Set v) -> Bool) -> Set v -> Bool #

and :: Set v -> Bool #

or :: Set v -> Bool #

find :: (Element (Set v) -> Bool) -> Set v -> Maybe (Element (Set v)) #

safeHead :: Set v -> Maybe (Element (Set v)) #

(Eq v, Hashable v) => Container (HashSet v) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element (HashSet v) #

Methods

toList :: HashSet v -> [Element (HashSet v)] #

null :: HashSet v -> Bool #

foldr :: (Element (HashSet v) -> b -> b) -> b -> HashSet v -> b #

foldl :: (b -> Element (HashSet v) -> b) -> b -> HashSet v -> b #

foldl' :: (b -> Element (HashSet v) -> b) -> b -> HashSet v -> b #

length :: HashSet v -> Int #

elem :: Element (HashSet v) -> HashSet v -> Bool #

maximum :: HashSet v -> Element (HashSet v) #

minimum :: HashSet v -> Element (HashSet v) #

foldMap :: Monoid m => (Element (HashSet v) -> m) -> HashSet v -> m #

fold :: HashSet v -> Element (HashSet v) #

foldr' :: (Element (HashSet v) -> b -> b) -> b -> HashSet v -> b #

foldr1 :: (Element (HashSet v) -> Element (HashSet v) -> Element (HashSet v)) -> HashSet v -> Element (HashSet v) #

foldl1 :: (Element (HashSet v) -> Element (HashSet v) -> Element (HashSet v)) -> HashSet v -> Element (HashSet v) #

notElem :: Element (HashSet v) -> HashSet v -> Bool #

all :: (Element (HashSet v) -> Bool) -> HashSet v -> Bool #

any :: (Element (HashSet v) -> Bool) -> HashSet v -> Bool #

and :: HashSet v -> Bool #

or :: HashSet v -> Bool #

find :: (Element (HashSet v) -> Bool) -> HashSet v -> Maybe (Element (HashSet v)) #

safeHead :: HashSet v -> Maybe (Element (HashSet v)) #

Container (Vector a) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element (Vector a) #

Methods

toList :: Vector a -> [Element (Vector a)] #

null :: Vector a -> Bool #

foldr :: (Element (Vector a) -> b -> b) -> b -> Vector a -> b #

foldl :: (b -> Element (Vector a) -> b) -> b -> Vector a -> b #

foldl' :: (b -> Element (Vector a) -> b) -> b -> Vector a -> b #

length :: Vector a -> Int #

elem :: Element (Vector a) -> Vector a -> Bool #

maximum :: Vector a -> Element (Vector a) #

minimum :: Vector a -> Element (Vector a) #

foldMap :: Monoid m => (Element (Vector a) -> m) -> Vector a -> m #

fold :: Vector a -> Element (Vector a) #

foldr' :: (Element (Vector a) -> b -> b) -> b -> Vector a -> b #

foldr1 :: (Element (Vector a) -> Element (Vector a) -> Element (Vector a)) -> Vector a -> Element (Vector a) #

foldl1 :: (Element (Vector a) -> Element (Vector a) -> Element (Vector a)) -> Vector a -> Element (Vector a) #

notElem :: Element (Vector a) -> Vector a -> Bool #

all :: (Element (Vector a) -> Bool) -> Vector a -> Bool #

any :: (Element (Vector a) -> Bool) -> Vector a -> Bool #

and :: Vector a -> Bool #

or :: Vector a -> Bool #

find :: (Element (Vector a) -> Bool) -> Vector a -> Maybe (Element (Vector a)) #

safeHead :: Vector a -> Maybe (Element (Vector a)) #

(TypeError (DisallowInstance "Either") :: Constraint) => Container (Either a b) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element (Either a b) #

Methods

toList :: Either a b -> [Element (Either a b)] #

null :: Either a b -> Bool #

foldr :: (Element (Either a b) -> b0 -> b0) -> b0 -> Either a b -> b0 #

foldl :: (b0 -> Element (Either a b) -> b0) -> b0 -> Either a b -> b0 #

foldl' :: (b0 -> Element (Either a b) -> b0) -> b0 -> Either a b -> b0 #

length :: Either a b -> Int #

elem :: Element (Either a b) -> Either a b -> Bool #

maximum :: Either a b -> Element (Either a b) #

minimum :: Either a b -> Element (Either a b) #

foldMap :: Monoid m => (Element (Either a b) -> m) -> Either a b -> m #

fold :: Either a b -> Element (Either a b) #

foldr' :: (Element (Either a b) -> b0 -> b0) -> b0 -> Either a b -> b0 #

foldr1 :: (Element (Either a b) -> Element (Either a b) -> Element (Either a b)) -> Either a b -> Element (Either a b) #

foldl1 :: (Element (Either a b) -> Element (Either a b) -> Element (Either a b)) -> Either a b -> Element (Either a b) #

notElem :: Element (Either a b) -> Either a b -> Bool #

all :: (Element (Either a b) -> Bool) -> Either a b -> Bool #

any :: (Element (Either a b) -> Bool) -> Either a b -> Bool #

and :: Either a b -> Bool #

or :: Either a b -> Bool #

find :: (Element (Either a b) -> Bool) -> Either a b -> Maybe (Element (Either a b)) #

safeHead :: Either a b -> Maybe (Element (Either a b)) #

(TypeError (DisallowInstance "tuple") :: Constraint) => Container (a, b) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element (a, b) #

Methods

toList :: (a, b) -> [Element (a, b)] #

null :: (a, b) -> Bool #

foldr :: (Element (a, b) -> b0 -> b0) -> b0 -> (a, b) -> b0 #

foldl :: (b0 -> Element (a, b) -> b0) -> b0 -> (a, b) -> b0 #

foldl' :: (b0 -> Element (a, b) -> b0) -> b0 -> (a, b) -> b0 #

length :: (a, b) -> Int #

elem :: Element (a, b) -> (a, b) -> Bool #

maximum :: (a, b) -> Element (a, b) #

minimum :: (a, b) -> Element (a, b) #

foldMap :: Monoid m => (Element (a, b) -> m) -> (a, b) -> m #

fold :: (a, b) -> Element (a, b) #

foldr' :: (Element (a, b) -> b0 -> b0) -> b0 -> (a, b) -> b0 #

foldr1 :: (Element (a, b) -> Element (a, b) -> Element (a, b)) -> (a, b) -> Element (a, b) #

foldl1 :: (Element (a, b) -> Element (a, b) -> Element (a, b)) -> (a, b) -> Element (a, b) #

notElem :: Element (a, b) -> (a, b) -> Bool #

all :: (Element (a, b) -> Bool) -> (a, b) -> Bool #

any :: (Element (a, b) -> Bool) -> (a, b) -> Bool #

and :: (a, b) -> Bool #

or :: (a, b) -> Bool #

find :: (Element (a, b) -> Bool) -> (a, b) -> Maybe (Element (a, b)) #

safeHead :: (a, b) -> Maybe (Element (a, b)) #

Container (HashMap k v) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element (HashMap k v) #

Methods

toList :: HashMap k v -> [Element (HashMap k v)] #

null :: HashMap k v -> Bool #

foldr :: (Element (HashMap k v) -> b -> b) -> b -> HashMap k v -> b #

foldl :: (b -> Element (HashMap k v) -> b) -> b -> HashMap k v -> b #

foldl' :: (b -> Element (HashMap k v) -> b) -> b -> HashMap k v -> b #

length :: HashMap k v -> Int #

elem :: Element (HashMap k v) -> HashMap k v -> Bool #

maximum :: HashMap k v -> Element (HashMap k v) #

minimum :: HashMap k v -> Element (HashMap k v) #

foldMap :: Monoid m => (Element (HashMap k v) -> m) -> HashMap k v -> m #

fold :: HashMap k v -> Element (HashMap k v) #

foldr' :: (Element (HashMap k v) -> b -> b) -> b -> HashMap k v -> b #

foldr1 :: (Element (HashMap k v) -> Element (HashMap k v) -> Element (HashMap k v)) -> HashMap k v -> Element (HashMap k v) #

foldl1 :: (Element (HashMap k v) -> Element (HashMap k v) -> Element (HashMap k v)) -> HashMap k v -> Element (HashMap k v) #

notElem :: Element (HashMap k v) -> HashMap k v -> Bool #

all :: (Element (HashMap k v) -> Bool) -> HashMap k v -> Bool #

any :: (Element (HashMap k v) -> Bool) -> HashMap k v -> Bool #

and :: HashMap k v -> Bool #

or :: HashMap k v -> Bool #

find :: (Element (HashMap k v) -> Bool) -> HashMap k v -> Maybe (Element (HashMap k v)) #

safeHead :: HashMap k v -> Maybe (Element (HashMap k v)) #

Container (Map k v) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element (Map k v) #

Methods

toList :: Map k v -> [Element (Map k v)] #

null :: Map k v -> Bool #

foldr :: (Element (Map k v) -> b -> b) -> b -> Map k v -> b #

foldl :: (b -> Element (Map k v) -> b) -> b -> Map k v -> b #

foldl' :: (b -> Element (Map k v) -> b) -> b -> Map k v -> b #

length :: Map k v -> Int #

elem :: Element (Map k v) -> Map k v -> Bool #

maximum :: Map k v -> Element (Map k v) #

minimum :: Map k v -> Element (Map k v) #

foldMap :: Monoid m => (Element (Map k v) -> m) -> Map k v -> m #

fold :: Map k v -> Element (Map k v) #

foldr' :: (Element (Map k v) -> b -> b) -> b -> Map k v -> b #

foldr1 :: (Element (Map k v) -> Element (Map k v) -> Element (Map k v)) -> Map k v -> Element (Map k v) #

foldl1 :: (Element (Map k v) -> Element (Map k v) -> Element (Map k v)) -> Map k v -> Element (Map k v) #

notElem :: Element (Map k v) -> Map k v -> Bool #

all :: (Element (Map k v) -> Bool) -> Map k v -> Bool #

any :: (Element (Map k v) -> Bool) -> Map k v -> Bool #

and :: Map k v -> Bool #

or :: Map k v -> Bool #

find :: (Element (Map k v) -> Bool) -> Map k v -> Maybe (Element (Map k v)) #

safeHead :: Map k v -> Maybe (Element (Map k v)) #

Container (Const a b) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Element (Const a b) #

Methods

toList :: Const a b -> [Element (Const a b)] #

null :: Const a b -> Bool #

foldr :: (Element (Const a b) -> b0 -> b0) -> b0 -> Const a b -> b0 #

foldl :: (b0 -> Element (Const a b) -> b0) -> b0 -> Const a b -> b0 #

foldl' :: (b0 -> Element (Const a b) -> b0) -> b0 -> Const a b -> b0 #

length :: Const a b -> Int #

elem :: Element (Const a b) -> Const a b -> Bool #

maximum :: Const a b -> Element (Const a b) #

minimum :: Const a b -> Element (Const a b) #

foldMap :: Monoid m => (Element (Const a b) -> m) -> Const a b -> m #

fold :: Const a b -> Element (Const a b) #

foldr' :: (Element (Const a b) -> b0 -> b0) -> b0 -> Const a b -> b0 #

foldr1 :: (Element (Const a b) -> Element (Const a b) -> Element (Const a b)) -> Const a b -> Element (Const a b) #

foldl1 :: (Element (Const a b) -> Element (Const a b) -> Element (Const a b)) -> Const a b -> Element (Const a b) #

notElem :: Element (Const a b) -> Const a b -> Bool #

all :: (Element (Const a b) -> Bool) -> Const a b -> Bool #

any :: (Element (Const a b) -> Bool) -> Const a b -> Bool #

and :: Const a b -> Bool #

or :: Const a b -> Bool #

find :: (Element (Const a b) -> Bool) -> Const a b -> Maybe (Element (Const a b)) #

safeHead :: Const a b -> Maybe (Element (Const a b)) #

type family Element t #

Type of element for some container. Implemented as an asscociated type family because some containers are monomorphic over element type (like Text, IntSet, etc.) so we can't implement nice interface using old higher-kinded types approach. Implementing this as an associated type family instead of top-level family gives you more control over element types.

Instances

Instances details
type Element ByteString 
Instance details

Defined in Universum.Container.Class

type Element ByteString 
Instance details

Defined in Universum.Container.Class

type Element Text 
Instance details

Defined in Universum.Container.Class

type Element Text 
Instance details

Defined in Universum.Container.Class

type Element IntSet 
Instance details

Defined in Universum.Container.Class

type Element MText 
Instance details

Defined in Michelson.Text

type Element [a] 
Instance details

Defined in Universum.Container.Class

type Element [a] = ElementDefault [a]
type Element (Maybe a) 
Instance details

Defined in Universum.Container.Class

type Element (Maybe a) = ElementDefault (Maybe a)
type Element (ZipList a) 
Instance details

Defined in Universum.Container.Class

type Element (ZipList a) = ElementDefault (ZipList a)
type Element (Identity a) 
Instance details

Defined in Universum.Container.Class

type Element (Identity a) = ElementDefault (Identity a)
type Element (First a) 
Instance details

Defined in Universum.Container.Class

type Element (First a) = ElementDefault (First a)
type Element (Last a) 
Instance details

Defined in Universum.Container.Class

type Element (Last a) = ElementDefault (Last a)
type Element (Dual a) 
Instance details

Defined in Universum.Container.Class

type Element (Dual a) = ElementDefault (Dual a)
type Element (Sum a) 
Instance details

Defined in Universum.Container.Class

type Element (Sum a) = ElementDefault (Sum a)
type Element (Product a) 
Instance details

Defined in Universum.Container.Class

type Element (Product a) = ElementDefault (Product a)
type Element (NonEmpty a) 
Instance details

Defined in Universum.Container.Class

type Element (NonEmpty a) = ElementDefault (NonEmpty a)
type Element (IntMap v) 
Instance details

Defined in Universum.Container.Class

type Element (IntMap v) = ElementDefault (IntMap v)
type Element (Seq a) 
Instance details

Defined in Universum.Container.Class

type Element (Seq a) = ElementDefault (Seq a)
type Element (Set v) 
Instance details

Defined in Universum.Container.Class

type Element (Set v) = ElementDefault (Set v)
type Element (HashSet v) 
Instance details

Defined in Universum.Container.Class

type Element (HashSet v) = ElementDefault (HashSet v)
type Element (Vector a) 
Instance details

Defined in Universum.Container.Class

type Element (Vector a) = ElementDefault (Vector a)
type Element (Either a b) 
Instance details

Defined in Universum.Container.Class

type Element (Either a b) = ElementDefault (Either a b)
type Element (a, b) 
Instance details

Defined in Universum.Container.Class

type Element (a, b) = ElementDefault (a, b)
type Element (HashMap k v) 
Instance details

Defined in Universum.Container.Class

type Element (HashMap k v) = ElementDefault (HashMap k v)
type Element (Map k v) 
Instance details

Defined in Universum.Container.Class

type Element (Map k v) = ElementDefault (Map k v)
type Element (Const a b) 
Instance details

Defined in Universum.Container.Class

type Element (Const a b) = ElementDefault (Const a b)

class ToPairs t where #

Type class for data types that can be converted to List of Pairs. You can define ToPairs by just defining toPairs function.

But the following laws should be met:

toPairs m ≡ zip (keys m) (elems m)
keysmap fst . toPairs
elemsmap snd . toPairs

Minimal complete definition

toPairs

Methods

toPairs :: t -> [(Key t, Val t)] #

Converts the structure to the list of the key-value pairs. >>> toPairs (HashMap.fromList [(a, "xxx"), (b, "yyy")]) [(a,"xxx"),(b,"yyy")]

keys :: t -> [Key t] #

Converts the structure to the list of the keys.

>>> keys (HashMap.fromList [('a', "xxx"), ('b', "yyy")])
"ab"

elems :: t -> [Val t] #

Converts the structure to the list of the values.

>>> elems (HashMap.fromList [('a', "xxx"), ('b', "yyy")])
["xxx","yyy"]

Instances

Instances details
ToPairs (IntMap v) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Key (IntMap v) #

type Val (IntMap v) #

Methods

toPairs :: IntMap v -> [(Key (IntMap v), Val (IntMap v))] #

keys :: IntMap v -> [Key (IntMap v)] #

elems :: IntMap v -> [Val (IntMap v)] #

ToPairs (HashMap k v) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Key (HashMap k v) #

type Val (HashMap k v) #

Methods

toPairs :: HashMap k v -> [(Key (HashMap k v), Val (HashMap k v))] #

keys :: HashMap k v -> [Key (HashMap k v)] #

elems :: HashMap k v -> [Val (HashMap k v)] #

ToPairs (Map k v) 
Instance details

Defined in Universum.Container.Class

Associated Types

type Key (Map k v) #

type Val (Map k v) #

Methods

toPairs :: Map k v -> [(Key (Map k v), Val (Map k v))] #

keys :: Map k v -> [Key (Map k v)] #

elems :: Map k v -> [Val (Map k v)] #

flipfoldl' :: (Container t, Element t ~ a) => (a -> b -> b) -> b -> t -> b #

Similar to foldl' but takes a function with its arguments flipped.

>>> flipfoldl' (/) 5 [2,3] :: Rational
15 % 2

sum :: (Container t, Num (Element t)) => t -> Element t #

Stricter version of sum.

>>> sum [1..10]
55
>>> sum (Just 3)
...
    • Do not use 'Foldable' methods on Maybe
      Suggestions:
          Instead of
              for_ :: (Foldable t, Applicative f) => t a -> (a -> f b) -> f ()
          use
              whenJust  :: Applicative f => Maybe a    -> (a -> f ()) -> f ()
              whenRight :: Applicative f => Either l r -> (r -> f ()) -> f ()
...
          Instead of
              fold :: (Foldable t, Monoid m) => t m -> m
          use
              maybeToMonoid :: Monoid m => Maybe m -> m
...

product :: (Container t, Num (Element t)) => t -> Element t #

Stricter version of product.

>>> product [1..10]
3628800
>>> product (Right 3)
...
    • Do not use 'Foldable' methods on Either
      Suggestions:
          Instead of
              for_ :: (Foldable t, Applicative f) => t a -> (a -> f b) -> f ()
          use
              whenJust  :: Applicative f => Maybe a    -> (a -> f ()) -> f ()
              whenRight :: Applicative f => Either l r -> (r -> f ()) -> f ()
...
          Instead of
              fold :: (Foldable t, Monoid m) => t m -> m
          use
              maybeToMonoid :: Monoid m => Maybe m -> m
...

traverse_ :: (Container t, Applicative f) => (Element t -> f b) -> t -> f () #

Constrained to Container version of traverse_.

>>> traverse_ putTextLn ["foo", "bar"]
foo
bar

for_ :: (Container t, Applicative f) => t -> (Element t -> f b) -> f () #

Constrained to Container version of for_.

>>> for_ [1 .. 5 :: Int] $ \i -> when (even i) (print i)
2
4

mapM_ :: (Container t, Monad m) => (Element t -> m b) -> t -> m () #

Constrained to Container version of mapM_.

>>> mapM_ print [True, False]
True
False

forM_ :: (Container t, Monad m) => t -> (Element t -> m b) -> m () #

Constrained to Container version of forM_.

>>> forM_ [True, False] print
True
False

sequenceA_ :: (Container t, Applicative f, Element t ~ f a) => t -> f () #

Constrained to Container version of sequenceA_.

>>> sequenceA_ [putTextLn "foo", print True]
foo
True

sequence_ :: (Container t, Monad m, Element t ~ m a) => t -> m () #

Constrained to Container version of sequence_.

>>> sequence_ [putTextLn "foo", print True]
foo
True

asum :: (Container t, Alternative f, Element t ~ f a) => t -> f a #

Constrained to Container version of asum.

>>> asum [Nothing, Just [False, True], Nothing, Just [True]]
Just [False,True]

concatMapM :: (Applicative f, Monoid m, Container (l m), Element (l m) ~ m, Traversable l) => (a -> f m) -> l a -> f m #

Lifting bind into a monad. Generalized version of concatMap that works with a monadic predicate. Old and simpler specialized to list version had next type:

concatMapM :: Monad m => (a -> m [b]) -> [a] -> m [b]

Side note: previously it had type

concatMapM :: (Applicative q, Monad m, Traversable m)
           => (a -> q (m b)) -> m a -> q (m b)

Such signature didn't allow to use this function when traversed container type and type of returned by function-argument differed. Now you can use it like e.g.

concatMapM readFile files >>= putTextLn

concatForM :: (Applicative f, Monoid m, Container (l m), Element (l m) ~ m, Traversable l) => l a -> (a -> f m) -> f m #

Like concatMapM, but has its arguments flipped, so can be used instead of the common fmap concat $ forM pattern.

andM :: (Container f, Element f ~ m Bool, Monad m) => f -> m Bool #

Monadic and constrained to Container version of and.

>>> andM [Just True, Just False]
Just False
>>> andM [Just True]
Just True
>>> andM [Just True, Just False, Nothing]
Just False
>>> andM [Just True, Nothing]
Nothing
>>> andM [putTextLn "1" >> pure True, putTextLn "2" >> pure False, putTextLn "3" >> pure True]
1
2
False

orM :: (Container f, Element f ~ m Bool, Monad m) => f -> m Bool #

Monadic and constrained to Container version of or.

>>> orM [Just True, Just False]
Just True
>>> orM [Just True, Nothing]
Just True
>>> orM [Nothing, Just True]
Nothing

allM :: (Container f, Monad m) => (Element f -> m Bool) -> f -> m Bool #

Monadic and constrained to Container version of all.

>>> allM (readMaybe >=> pure . even) ["6", "10"]
Just True
>>> allM (readMaybe >=> pure . even) ["5", "aba"]
Just False
>>> allM (readMaybe >=> pure . even) ["aba", "10"]
Nothing

anyM :: (Container f, Monad m) => (Element f -> m Bool) -> f -> m Bool #

Monadic and constrained to Container version of any.

>>> anyM (readMaybe >=> pure . even) ["5", "10"]
Just True
>>> anyM (readMaybe >=> pure . even) ["10", "aba"]
Just True
>>> anyM (readMaybe >=> pure . even) ["aba", "10"]
Nothing

uncons :: [a] -> Maybe (a, [a]) #

Destructuring list into its head and tail if possible. This function is total.

>>> uncons []
Nothing
>>> uncons [1..5]
Just (1,[2,3,4,5])
>>> uncons (5 : [1..5]) >>= \(f, l) -> pure $ f == length l
Just True

whenNotNull :: Applicative f => [a] -> (NonEmpty a -> f ()) -> f () #

Performs given action over NonEmpty list if given list is non empty.

>>> whenNotNull [] $ \(b :| _) -> print (not b)
>>> whenNotNull [False,True] $ \(b :| _) -> print (not b)
True

whenNotNullM :: Monad m => m [a] -> (NonEmpty a -> m ()) -> m () #

Monadic version of whenNotNull.

data Bug #

Type that represents exceptions used in cases when a particular codepath is not meant to be ever executed, but happens to be executed anyway.

Instances

Instances details
Show Bug 
Instance details

Defined in Universum.Exception

Methods

showsPrec :: Int -> Bug -> ShowS #

show :: Bug -> String #

showList :: [Bug] -> ShowS #

Exception Bug 
Instance details

Defined in Universum.Exception

pattern Exc :: Exception e => e -> SomeException #

Pattern synonym to easy pattern matching on exceptions. So intead of writing something like this:

isNonCriticalExc e
    | Just (_ :: NodeAttackedError) <- fromException e = True
    | Just DialogUnexpected{} <- fromException e = True
    | otherwise = False

you can use Exc pattern synonym:

isNonCriticalExc = case
    Exc (_ :: NodeAttackedError) -> True  -- matching all exceptions of type NodeAttackedError
    Exc DialogUnexpected{} -> True
    _ -> False

This pattern is bidirectional. You can use Exc e instead of toException e.

bug :: (HasCallStack, Exception e) => e -> a #

Generate a pure value which, when forced, will synchronously throw the exception wrapped into Bug data type.

note :: MonadError e m => e -> Maybe a -> m a #

Throws error for Maybe if Nothing is given. Operates over MonadError.

evaluateWHNF :: MonadIO m => a -> m a #

Lifted alias for evaluate with clearer name.

evaluateWHNF_ :: MonadIO m => a -> m () #

Like evaluateWNHF but discards value.

evaluateNF :: (NFData a, MonadIO m) => a -> m a #

Alias for evaluateWHNF . force with clearer name.

evaluateNF_ :: (NFData a, MonadIO m) => a -> m () #

Alias for evaluateWHNF . rnf. Similar to evaluateNF but discards resulting value.

whenM :: Monad m => m Bool -> m () -> m () #

Monadic version of when.

>>> whenM (pure False) $ putTextLn "No text :("
>>> whenM (pure True)  $ putTextLn "Yes text :)"
Yes text :)
>>> whenM (Just True) (pure ())
Just ()
>>> whenM (Just False) (pure ())
Just ()
>>> whenM Nothing (pure ())
Nothing

unlessM :: Monad m => m Bool -> m () -> m () #

Monadic version of unless.

>>> unlessM (pure False) $ putTextLn "No text :("
No text :(
>>> unlessM (pure True) $ putTextLn "Yes text :)"

ifM :: Monad m => m Bool -> m a -> m a -> m a #

Monadic version of if-then-else.

>>> ifM (pure True) (putTextLn "True text") (putTextLn "False text")
True text

guardM :: MonadPlus m => m Bool -> m () #

Monadic version of guard. Occasionally useful. Here some complex but real-life example:

findSomePath :: IO (Maybe FilePath)

somePath :: MaybeT IO FilePath
somePath = do
    path <- MaybeT findSomePath
    guardM $ liftIO $ doesDirectoryExist path
    return path

ordNub :: Ord a => [a] -> [a] #

Like nub but runs in O(n * log n) time and requires Ord.

>>> ordNub [3, 3, 3, 2, 2, -1, 1]
[3,2,-1,1]

hashNub :: (Eq a, Hashable a) => [a] -> [a] #

Like nub but runs in O(n * log_16(n)) time and requires Hashable.

>>> hashNub [3, 3, 3, 2, 2, -1, 1]
[3,2,-1,1]

sortNub :: Ord a => [a] -> [a] #

Like ordNub but also sorts a list.

>>> sortNub [3, 3, 3, 2, 2, -1, 1]
[-1,1,2,3]

unstableNub :: (Eq a, Hashable a) => [a] -> [a] #

Like hashNub but has better performance and also doesn't save the order.

>>> unstableNub [3, 3, 3, 2, 2, -1, 1]
[1,2,3,-1]

class Print a #

Support class to overload writing of string like values.

Minimal complete definition

hPutStr, hPutStrLn

Instances

Instances details
Print ByteString 
Instance details

Defined in Universum.Print.Internal

Methods

hPutStr :: Handle -> ByteString -> IO () #

hPutStrLn :: Handle -> ByteString -> IO () #

Print ByteString 
Instance details

Defined in Universum.Print.Internal

Methods

hPutStr :: Handle -> ByteString -> IO () #

hPutStrLn :: Handle -> ByteString -> IO () #

Print Text 
Instance details

Defined in Universum.Print.Internal

Methods

hPutStr :: Handle -> Text -> IO () #

hPutStrLn :: Handle -> Text -> IO () #

Print Text 
Instance details

Defined in Universum.Print.Internal

Methods

hPutStr :: Handle -> Text -> IO () #

hPutStrLn :: Handle -> Text -> IO () #

Print [Char] 
Instance details

Defined in Universum.Print.Internal

Methods

hPutStr :: Handle -> [Char] -> IO () #

hPutStrLn :: Handle -> [Char] -> IO () #

hPutStr :: (Print a, MonadIO m) => Handle -> a -> m () #

Write a string like value a to a supplied Handle.

hPutStrLn :: (Print a, MonadIO m) => Handle -> a -> m () #

Write a string like value a to a supplied Handle, appending a newline character.

putStr :: (Print a, MonadIO m) => a -> m () #

Write a string like value to stdout/.

putStrLn :: (Print a, MonadIO m) => a -> m () #

Write a string like value to stdout appending a newline character.

print :: forall a m. (MonadIO m, Show a) => a -> m () #

Lifted version of print.

hPrint :: (MonadIO m, Show a) => Handle -> a -> m () #

Lifted version of hPrint

putText :: MonadIO m => Text -> m () #

Specialized to Text version of putStr or forcing type inference.

putTextLn :: MonadIO m => Text -> m () #

Specialized to Text version of putStrLn or forcing type inference.

putLText :: MonadIO m => Text -> m () #

Specialized to Text version of putStr or forcing type inference.

putLTextLn :: MonadIO m => Text -> m () #

Specialized to Text version of putStrLn or forcing type inference.

data Undefined #

Similar to undefined but data type.

Constructors

Undefined 

Instances

Instances details
Bounded Undefined 
Instance details

Defined in Universum.Debug

Enum Undefined 
Instance details

Defined in Universum.Debug

Eq Undefined 
Instance details

Defined in Universum.Debug

Data Undefined 
Instance details

Defined in Universum.Debug

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Undefined -> c Undefined #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Undefined #

toConstr :: Undefined -> Constr #

dataTypeOf :: Undefined -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Undefined) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Undefined) #

gmapT :: (forall b. Data b => b -> b) -> Undefined -> Undefined #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Undefined -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Undefined -> r #

gmapQ :: (forall d. Data d => d -> u) -> Undefined -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Undefined -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Undefined -> m Undefined #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Undefined -> m Undefined #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Undefined -> m Undefined #

Ord Undefined 
Instance details

Defined in Universum.Debug

Read Undefined 
Instance details

Defined in Universum.Debug

Show Undefined 
Instance details

Defined in Universum.Debug

Generic Undefined 
Instance details

Defined in Universum.Debug

Associated Types

type Rep Undefined :: Type -> Type #

type Rep Undefined 
Instance details

Defined in Universum.Debug

type Rep Undefined = D1 ('MetaData "Undefined" "Universum.Debug" "universum-1.6.1-9S3REjxS97oDtyplhqPK9g" 'False) (C1 ('MetaCons "Undefined" 'PrefixI 'False) (U1 :: Type -> Type))

trace :: Text -> a -> a #

Version of trace that leaves a warning and takes Text.

traceShow :: Show a => a -> b -> b #

Version of traceShow that leaves a warning.

traceShowId :: Show a => a -> a #

Version of traceShowId that leaves a warning.

traceIdWith :: (a -> Text) -> a -> a #

Version of traceId that leaves a warning. Useful to tag printed data, for instance:

traceIdWith (x -> "My data: " <> show x) (veryLargeExpression)

This is especially useful with custom formatters:

traceIdWith (x -> "My data: " <> pretty x) (veryLargeExpression)

traceShowIdWith :: Show s => (a -> s) -> a -> a #

Version of traceShowId that leaves a warning. Useful to tag printed data, for instance:

traceShowIdWith ("My data: ", ) (veryLargeExpression)

traceShowM :: (Show a, Monad m) => a -> m () #

Version of traceShowM that leaves a warning.

traceM :: Monad m => Text -> m () #

Version of traceM that leaves a warning and takes Text.

traceId :: Text -> Text #

Version of traceId that leaves a warning.

class ToString a where #

Type class for converting other strings to String.

Methods

toString :: a -> String #

Instances

Instances details
ToString String 
Instance details

Defined in Universum.String.Conversion

Methods

toString :: String -> String #

ToString Text 
Instance details

Defined in Universum.String.Conversion

Methods

toString :: Text -> String #

ToString Text 
Instance details

Defined in Universum.String.Conversion

Methods

toString :: Text -> String #

class ToLText a where #

Type class for converting other strings to Text.

Methods

toLText :: a -> Text #

Instances

Instances details
ToLText String 
Instance details

Defined in Universum.String.Conversion

Methods

toLText :: String -> Text #

ToLText Text 
Instance details

Defined in Universum.String.Conversion

Methods

toLText :: Text -> Text0 #

ToLText Text 
Instance details

Defined in Universum.String.Conversion

Methods

toLText :: Text -> Text #

class ToText a where #

Type class for converting other strings to Text.

Methods

toText :: a -> Text #

Instances

Instances details
ToText String 
Instance details

Defined in Universum.String.Conversion

Methods

toText :: String -> Text #

ToText Text 
Instance details

Defined in Universum.String.Conversion

Methods

toText :: Text -> Text #

ToText Text 
Instance details

Defined in Universum.String.Conversion

Methods

toText :: Text -> Text0 #

ToText MText 
Instance details

Defined in Michelson.Text

Methods

toText :: MText -> Text #

class ConvertUtf8 a b where #

Type class for conversion to utf8 representation of text.

Methods

encodeUtf8 :: a -> b #

Encode as utf8 string (usually ByteString).

>>> encodeUtf8 @Text @ByteString "патак"
"\208\191\208\176\209\130\208\176\208\186"

decodeUtf8 :: b -> a #

Decode from utf8 string.

>>> decodeUtf8 @Text @ByteString "\208\191\208\176\209\130\208\176\208\186"
"\1087\1072\1090\1072\1082"
>>> putStrLn $ decodeUtf8 @Text @ByteString "\208\191\208\176\209\130\208\176\208\186"
патак

decodeUtf8Strict :: b -> Either UnicodeException a #

Decode as utf8 string but returning execption if byte sequence is malformed.

>>> decodeUtf8 @Text @ByteString "\208\208\176\209\130\208\176\208\186"
"\65533\1072\1090\1072\1082"
>>> decodeUtf8Strict @Text @ByteString "\208\208\176\209\130\208\176\208\186"
Left Cannot decode byte '\xd0': Data.Text.Internal.Encoding.decodeUtf8: Invalid UTF-8 stream

type LByteString = ByteString #

Type synonym for ByteString.

type LText = Text #

Type synonym for Text.

readEither :: (ToString a, Read b) => a -> Either Text b #

Polymorhpic version of readEither.

>>> readEither @Text @Int "123"
Right 123
>>> readEither @Text @Int "aa"
Left "Prelude.read: no parse"

type With (a :: [k -> Constraint]) (b :: k) = a <+> b #

Map several constraints over a single variable. Note, that With a b ≡ Each a '[b]

a :: With [Show, Read] a => a -> a
=
a :: (Show a, Read a) => a -> a

class SuperComposition a b c | a b -> c where #

This type class allows to implement variadic composition operator.

Methods

(...) :: a -> b -> c infixl 8 #

Allows to apply function to result of another function with multiple arguments.

>>> (show ... (+)) 1 2
"3"
>>> show ... 5
"5"
>>> (null ... zip5) [1] [2] [3] [] [5]
True

Inspired by http://stackoverflow.com/questions/9656797/variadic-compose-function.

Performance

To check the performance there was done a bunch of benchmarks. Benchmarks were made on examples given above and also on the functions of many arguments. The results are showing that the operator (...) performs as fast as plain applications of the operator (.) on almost all the tests, but (...) leads to the performance draw-down if ghc fails to inline it. Slow behavior was noticed on functions without type specifications. That's why keep in mind that providing explicit type declarations for functions is very important when using (...). Relying on type inference will lead to the situation when all optimizations disappear due to very general inferred type. However, functions without type specification but with applied INLINE pragma are fast again.

Instances

Instances details
(a ~ c, r ~ b) => SuperComposition (a -> b) c r 
Instance details

Defined in Universum.VarArg

Methods

(...) :: (a -> b) -> c -> r #

(SuperComposition (a -> b) d r1, r ~ (c -> r1)) => SuperComposition (a -> b) (c -> d) r 
Instance details

Defined in Universum.VarArg

Methods

(...) :: (a -> b) -> (c -> d) -> r #

maybeToExceptT :: forall (m :: Type -> Type) e a. Functor m => e -> MaybeT m a -> ExceptT e m a #

Convert a MaybeT computation to ExceptT, with a default exception value.

exceptToMaybeT :: forall (m :: Type -> Type) e a. Functor m => ExceptT e m a -> MaybeT m a #

Convert a ExceptT computation to MaybeT, discarding the value of any exception.

type OnDecodeError = OnError Word8 Char #

A handler for a decoding error.

type OnError a b = String -> Maybe a -> Maybe b #

Function type for handling a coding error. It is supplied with two inputs:

  • A String that describes the error.
  • The input value that caused the error. If the error arose because the end of input was reached or could not be identified precisely, this value will be Nothing.

If the handler returns a value wrapped with Just, that value will be used in the output as the replacement for the invalid input. If it returns Nothing, no value will be used in the output.

Should the handler need to abort processing, it should use error or throw an exception (preferably a UnicodeException). It may use the description provided to construct a more helpful error report.

strictDecode :: OnDecodeError #

Throw a UnicodeException if decoding fails.

lenientDecode :: OnDecodeError #

Replace an invalid input byte with the Unicode replacement character U+FFFD.

decodeUtf8With :: OnDecodeError -> ByteString -> Text #

Decode a ByteString containing UTF-8 encoded text.

NOTE: The replacement character returned by OnDecodeError MUST be within the BMP plane; surrogate code points will automatically be remapped to the replacement char U+FFFD (since 0.11.3.0), whereas code points beyond the BMP will throw an error (since 1.2.3.1); For earlier versions of text using those unsupported code points would result in undefined behavior.

decodeUtf8' :: ByteString -> Either UnicodeException Text #

Decode a ByteString containing UTF-8 encoded text.

If the input contains any invalid UTF-8 data, the relevant exception will be returned, otherwise the decoded text.

words :: Text -> [Text] #

O(n) Breaks a Text up into a list of words, delimited by Chars representing white space.

lines :: Text -> [Text] #

O(n) Breaks a Text up into a list of Texts at newline Chars. The resulting strings do not contain newlines.

unlines :: [Text] -> Text #

O(n) Joins lines, after appending a terminating newline to each.

unwords :: [Text] -> Text #

O(n) Joins words using single space characters.

fromStrict :: Text -> Text #

O(c) Convert a strict Text into a lazy Text.

modifyTVar' :: TVar a -> (a -> a) -> STM () #

Strict version of modifyTVar.

Since: stm-2.3

throwM :: (MonadThrow m, Exception e) => e -> m a #

Synonym for throw

Since: safe-exceptions-0.1.0.0

catch :: (MonadCatch m, Exception e) => m a -> (e -> m a) -> m a #

Same as upstream catch, but will not catch asynchronous exceptions

Since: safe-exceptions-0.1.0.0

catchAny :: MonadCatch m => m a -> (SomeException -> m a) -> m a #

catch specialized to catch all synchronous exception

Since: safe-exceptions-0.1.0.0

handleAny :: MonadCatch m => (SomeException -> m a) -> m a -> m a #

Flipped version of catchAny

Since: safe-exceptions-0.1.0.0

try :: (MonadCatch m, Exception e) => m a -> m (Either e a) #

Same as upstream try, but will not catch asynchronous exceptions

Since: safe-exceptions-0.1.0.0

tryAny :: MonadCatch m => m a -> m (Either SomeException a) #

try specialized to catch all synchronous exceptions

Since: safe-exceptions-0.1.0.0

onException :: MonadMask m => m a -> m b -> m a #

Async safe version of onException

Since: safe-exceptions-0.1.0.0

bracket :: MonadMask m => m a -> (a -> m b) -> (a -> m c) -> m c #

Async safe version of bracket

Since: safe-exceptions-0.1.7.0

bracket_ :: MonadMask m => m a -> m b -> m c -> m c #

Async safe version of bracket_

Since: safe-exceptions-0.1.0.0

finally :: MonadMask m => m a -> m b -> m a #

Async safe version of finally

Since: safe-exceptions-0.1.0.0

bracketOnError :: MonadMask m => m a -> (a -> m b) -> (a -> m c) -> m c #

Async safe version of bracketOnError

Since: safe-exceptions-0.1.0.0

execStateT :: Monad m => StateT s m a -> s -> m s #

Evaluate a state computation with the given initial state and return the final state, discarding the final value.

evalStateT :: Monad m => StateT s m a -> s -> m a #

Evaluate a state computation with the given initial state and return the final value, discarding the final state.

withState :: (s -> s) -> State s a -> State s a #

withState f m executes action m on a state modified by applying f.

execState #

Arguments

:: State s a

state-passing computation to execute

-> s

initial value

-> s

final state

Evaluate a state computation with the given initial state and return the final state, discarding the final value.

evalState #

Arguments

:: State s a

state-passing computation to execute

-> s

initial value

-> a

return value of the state computation

Evaluate a state computation with the given initial state and return the final value, discarding the final state.

runState #

Arguments

:: State s a

state-passing computation to execute

-> s

initial state

-> (a, s)

return value and final state

Unwrap a state monad computation as a function. (The inverse of state.)

runReader #

Arguments

:: Reader r a

A Reader to run.

-> r

An initial environment.

-> a 

Runs a Reader and extracts the final value from it. (The inverse of reader.)

runExceptT :: ExceptT e m a -> m (Either e a) #

The inverse of ExceptT.

modify' :: MonadState s m => (s -> s) -> m () #

A variant of modify in which the computation is strict in the new state.

Since: mtl-2.2

class MonadTrans (t :: (Type -> Type) -> Type -> Type) where #

The class of monad transformers. Instances should satisfy the following laws, which state that lift is a monad transformation:

Methods

lift :: Monad m => m a -> t m a #

Lift a computation from the argument monad to the constructed monad.

Instances

Instances details
MonadTrans MaybeT 
Instance details

Defined in Control.Monad.Trans.Maybe

Methods

lift :: Monad m => m a -> MaybeT m a #

MonadTrans Free

This is not a true monad transformer. It is only a monad transformer "up to retract".

Instance details

Defined in Control.Monad.Free

Methods

lift :: Monad m => m a -> Free m a #

MonadTrans Yoneda 
Instance details

Defined in Data.Functor.Yoneda

Methods

lift :: Monad m => m a -> Yoneda m a #

MonadTrans (IdentityT :: (Type -> Type) -> Type -> Type) 
Instance details

Defined in Control.Monad.Trans.Identity

Methods

lift :: Monad m => m a -> IdentityT m a #

MonadTrans (ExceptT e) 
Instance details

Defined in Control.Monad.Trans.Except

Methods

lift :: Monad m => m a -> ExceptT e m a #

MonadTrans (FreeT f) 
Instance details

Defined in Control.Monad.Trans.Free

Methods

lift :: Monad m => m a -> FreeT f m a #

Alternative f => MonadTrans (CofreeT f) 
Instance details

Defined in Control.Comonad.Trans.Cofree

Methods

lift :: Monad m => m a -> CofreeT f m a #

MonadTrans (ErrorT e) 
Instance details

Defined in Control.Monad.Trans.Error

Methods

lift :: Monad m => m a -> ErrorT e m a #

MonadTrans (StateT s) 
Instance details

Defined in Control.Monad.Trans.State.Strict

Methods

lift :: Monad m => m a -> StateT s m a #

MonadTrans (ReaderT r) 
Instance details

Defined in Control.Monad.Trans.Reader

Methods

lift :: Monad m => m a -> ReaderT r m a #