generics-sop-0.3.2.0: Generic Programming using True Sums of Products

Safe HaskellNone
LanguageHaskell2010

Generics.SOP.Instances

Contents

Description

Instances for Generic and HasMetadata.

We define instances for datatypes from generics-sop and base that are supported.

(There are only instances defined in this module, so the documentation is empty.)

Orphan instances

HasDatatypeInfo Bool Source # 

Associated Types

type DatatypeInfoOf Bool :: DatatypeInfo Source #

HasDatatypeInfo Ordering Source # 
HasDatatypeInfo () Source # 

Associated Types

type DatatypeInfoOf () :: DatatypeInfo Source #

Methods

datatypeInfo :: proxy () -> DatatypeInfo (Code ()) Source #

HasDatatypeInfo DataRep Source # 
HasDatatypeInfo ConstrRep Source # 
HasDatatypeInfo Fixity Source # 
HasDatatypeInfo FormatAdjustment Source # 
HasDatatypeInfo FormatSign Source # 
HasDatatypeInfo FieldFormat Source # 
HasDatatypeInfo FormatParse Source # 
HasDatatypeInfo Version Source # 
HasDatatypeInfo PatternMatchFail Source # 
HasDatatypeInfo RecSelError Source # 
HasDatatypeInfo RecConError Source # 
HasDatatypeInfo RecUpdError Source # 
HasDatatypeInfo NoMethodError Source # 
HasDatatypeInfo NonTermination Source # 
HasDatatypeInfo NestedAtomically Source # 
HasDatatypeInfo Errno Source # 

Associated Types

type DatatypeInfoOf Errno :: DatatypeInfo Source #

HasDatatypeInfo BlockedIndefinitelyOnMVar Source # 
HasDatatypeInfo BlockedIndefinitelyOnSTM Source # 
HasDatatypeInfo Deadlock Source # 
HasDatatypeInfo AssertionFailed Source # 
HasDatatypeInfo AsyncException Source # 
HasDatatypeInfo ArrayException Source # 
HasDatatypeInfo ExitCode Source # 
HasDatatypeInfo BufferMode Source # 
HasDatatypeInfo Newline Source # 
HasDatatypeInfo NewlineMode Source # 
HasDatatypeInfo SeekMode Source # 
HasDatatypeInfo MaskingState Source # 
HasDatatypeInfo IOException Source # 
HasDatatypeInfo ErrorCall Source # 
HasDatatypeInfo ArithException Source # 
HasDatatypeInfo All Source # 

Associated Types

type DatatypeInfoOf All :: DatatypeInfo Source #

HasDatatypeInfo Any Source # 

Associated Types

type DatatypeInfoOf Any :: DatatypeInfo Source #

HasDatatypeInfo CChar Source # 

Associated Types

type DatatypeInfoOf CChar :: DatatypeInfo Source #

HasDatatypeInfo CSChar Source # 
HasDatatypeInfo CUChar Source # 
HasDatatypeInfo CShort Source # 
HasDatatypeInfo CUShort Source # 
HasDatatypeInfo CInt Source # 

Associated Types

type DatatypeInfoOf CInt :: DatatypeInfo Source #

HasDatatypeInfo CUInt Source # 

Associated Types

type DatatypeInfoOf CUInt :: DatatypeInfo Source #

HasDatatypeInfo CLong Source # 

Associated Types

type DatatypeInfoOf CLong :: DatatypeInfo Source #

HasDatatypeInfo CULong Source # 
HasDatatypeInfo CLLong Source # 
HasDatatypeInfo CULLong Source # 
HasDatatypeInfo CFloat Source # 
HasDatatypeInfo CDouble Source # 
HasDatatypeInfo CPtrdiff Source # 
HasDatatypeInfo CSize Source # 

Associated Types

type DatatypeInfoOf CSize :: DatatypeInfo Source #

HasDatatypeInfo CWchar Source # 
HasDatatypeInfo CSigAtomic Source # 
HasDatatypeInfo CClock Source # 
HasDatatypeInfo CTime Source # 

Associated Types

type DatatypeInfoOf CTime :: DatatypeInfo Source #

HasDatatypeInfo CUSeconds Source # 
HasDatatypeInfo CSUSeconds Source # 
HasDatatypeInfo CIntPtr Source # 
HasDatatypeInfo CUIntPtr Source # 
HasDatatypeInfo CIntMax Source # 
HasDatatypeInfo CUIntMax Source # 
HasDatatypeInfo IOMode Source # 
HasDatatypeInfo Lexeme Source # 
HasDatatypeInfo Number Source # 
HasDatatypeInfo GeneralCategory Source # 
Generic Bool Source # 

Associated Types

type Code Bool :: [[*]] Source #

Methods

from :: Bool -> Rep Bool Source #

to :: Rep Bool -> Bool Source #

Generic Ordering Source # 

Associated Types

type Code Ordering :: [[*]] Source #

Generic () Source # 

Associated Types

type Code () :: [[*]] Source #

Methods

from :: () -> Rep () Source #

to :: Rep () -> () Source #

Generic DataRep Source # 

Associated Types

type Code DataRep :: [[*]] Source #

Generic ConstrRep Source # 

Associated Types

type Code ConstrRep :: [[*]] Source #

Generic Fixity Source # 

Associated Types

type Code Fixity :: [[*]] Source #

Generic FormatAdjustment Source # 
Generic FormatSign Source # 

Associated Types

type Code FormatSign :: [[*]] Source #

Generic FieldFormat Source # 

Associated Types

type Code FieldFormat :: [[*]] Source #

Generic FormatParse Source # 

Associated Types

type Code FormatParse :: [[*]] Source #

Generic Version Source # 

Associated Types

type Code Version :: [[*]] Source #

Generic PatternMatchFail Source # 
Generic RecSelError Source # 

Associated Types

type Code RecSelError :: [[*]] Source #

Generic RecConError Source # 

Associated Types

type Code RecConError :: [[*]] Source #

Generic RecUpdError Source # 

Associated Types

type Code RecUpdError :: [[*]] Source #

Generic NoMethodError Source # 
Generic NonTermination Source # 
Generic NestedAtomically Source # 
Generic Errno Source # 

Associated Types

type Code Errno :: [[*]] Source #

Generic BlockedIndefinitelyOnMVar Source # 
Generic BlockedIndefinitelyOnSTM Source # 
Generic Deadlock Source # 

Associated Types

type Code Deadlock :: [[*]] Source #

Generic AssertionFailed Source # 
Generic AsyncException Source # 
Generic ArrayException Source # 
Generic ExitCode Source # 

Associated Types

type Code ExitCode :: [[*]] Source #

Generic BufferMode Source # 

Associated Types

type Code BufferMode :: [[*]] Source #

Generic Newline Source # 

Associated Types

type Code Newline :: [[*]] Source #

Generic NewlineMode Source # 

Associated Types

type Code NewlineMode :: [[*]] Source #

Generic SeekMode Source # 

Associated Types

type Code SeekMode :: [[*]] Source #

Generic MaskingState Source # 
Generic IOException Source # 

Associated Types

type Code IOException :: [[*]] Source #

Generic ErrorCall Source # 

Associated Types

type Code ErrorCall :: [[*]] Source #

Generic ArithException Source # 
Generic All Source # 

Associated Types

type Code All :: [[*]] Source #

Methods

from :: All -> Rep All Source #

to :: Rep All -> All Source #

Generic Any Source # 

Associated Types

type Code Any :: [[*]] Source #

Methods

from :: Any -> Rep Any Source #

to :: Rep Any -> Any Source #

Generic CChar Source # 

Associated Types

type Code CChar :: [[*]] Source #

Generic CSChar Source # 

Associated Types

type Code CSChar :: [[*]] Source #

Generic CUChar Source # 

Associated Types

type Code CUChar :: [[*]] Source #

Generic CShort Source # 

Associated Types

type Code CShort :: [[*]] Source #

Generic CUShort Source # 

Associated Types

type Code CUShort :: [[*]] Source #

Generic CInt Source # 

Associated Types

type Code CInt :: [[*]] Source #

Methods

from :: CInt -> Rep CInt Source #

to :: Rep CInt -> CInt Source #

Generic CUInt Source # 

Associated Types

type Code CUInt :: [[*]] Source #

Generic CLong Source # 

Associated Types

type Code CLong :: [[*]] Source #

Generic CULong Source # 

Associated Types

type Code CULong :: [[*]] Source #

Generic CLLong Source # 

Associated Types

type Code CLLong :: [[*]] Source #

Generic CULLong Source # 

Associated Types

type Code CULLong :: [[*]] Source #

Generic CFloat Source # 

Associated Types

type Code CFloat :: [[*]] Source #

Generic CDouble Source # 

Associated Types

type Code CDouble :: [[*]] Source #

Generic CPtrdiff Source # 

Associated Types

type Code CPtrdiff :: [[*]] Source #

Generic CSize Source # 

Associated Types

type Code CSize :: [[*]] Source #

Generic CWchar Source # 

Associated Types

type Code CWchar :: [[*]] Source #

Generic CSigAtomic Source # 

Associated Types

type Code CSigAtomic :: [[*]] Source #

Generic CClock Source # 

Associated Types

type Code CClock :: [[*]] Source #

Generic CTime Source # 

Associated Types

type Code CTime :: [[*]] Source #

Generic CUSeconds Source # 

Associated Types

type Code CUSeconds :: [[*]] Source #

Generic CSUSeconds Source # 

Associated Types

type Code CSUSeconds :: [[*]] Source #

Generic CIntPtr Source # 

Associated Types

type Code CIntPtr :: [[*]] Source #

Generic CUIntPtr Source # 

Associated Types

type Code CUIntPtr :: [[*]] Source #

Generic CIntMax Source # 

Associated Types

type Code CIntMax :: [[*]] Source #

Generic CUIntMax Source # 

Associated Types

type Code CUIntMax :: [[*]] Source #

Generic IOMode Source # 

Associated Types

type Code IOMode :: [[*]] Source #

Generic Lexeme Source # 

Associated Types

type Code Lexeme :: [[*]] Source #

Generic Number Source # 

Associated Types

type Code Number :: [[*]] Source #

Generic GeneralCategory Source # 
HasDatatypeInfo [a] Source # 

Associated Types

type DatatypeInfoOf [a] :: DatatypeInfo Source #

Methods

datatypeInfo :: proxy [a] -> DatatypeInfo (Code [a]) Source #

HasDatatypeInfo (Maybe a) Source # 

Associated Types

type DatatypeInfoOf (Maybe a) :: DatatypeInfo Source #

Methods

datatypeInfo :: proxy (Maybe a) -> DatatypeInfo (Code (Maybe a)) Source #

HasDatatypeInfo (Complex a) Source # 

Associated Types

type DatatypeInfoOf (Complex a) :: DatatypeInfo Source #

Methods

datatypeInfo :: proxy (Complex a) -> DatatypeInfo (Code (Complex a)) Source #

HasDatatypeInfo (Fixed a) Source # 

Associated Types

type DatatypeInfoOf (Fixed a) :: DatatypeInfo Source #

Methods

datatypeInfo :: proxy (Fixed a) -> DatatypeInfo (Code (Fixed a)) Source #

HasDatatypeInfo (ArgOrder a) Source # 

Associated Types

type DatatypeInfoOf (ArgOrder a) :: DatatypeInfo Source #

Methods

datatypeInfo :: proxy (ArgOrder a) -> DatatypeInfo (Code (ArgOrder a)) Source #

HasDatatypeInfo (OptDescr a) Source # 

Associated Types

type DatatypeInfoOf (OptDescr a) :: DatatypeInfo Source #

Methods

datatypeInfo :: proxy (OptDescr a) -> DatatypeInfo (Code (OptDescr a)) Source #

HasDatatypeInfo (ArgDescr a) Source # 

Associated Types

type DatatypeInfoOf (ArgDescr a) :: DatatypeInfo Source #

Methods

datatypeInfo :: proxy (ArgDescr a) -> DatatypeInfo (Code (ArgDescr a)) Source #

HasDatatypeInfo (Dual a) Source # 

Associated Types

type DatatypeInfoOf (Dual a) :: DatatypeInfo Source #

Methods

datatypeInfo :: proxy (Dual a) -> DatatypeInfo (Code (Dual a)) Source #

HasDatatypeInfo (Endo a) Source # 

Associated Types

type DatatypeInfoOf (Endo a) :: DatatypeInfo Source #

Methods

datatypeInfo :: proxy (Endo a) -> DatatypeInfo (Code (Endo a)) Source #

HasDatatypeInfo (Sum a) Source # 

Associated Types

type DatatypeInfoOf (Sum a) :: DatatypeInfo Source #

Methods

datatypeInfo :: proxy (Sum a) -> DatatypeInfo (Code (Sum a)) Source #

HasDatatypeInfo (Product a) Source # 

Associated Types

type DatatypeInfoOf (Product a) :: DatatypeInfo Source #

Methods

datatypeInfo :: proxy (Product a) -> DatatypeInfo (Code (Product a)) Source #

HasDatatypeInfo (First a) Source # 

Associated Types

type DatatypeInfoOf (First a) :: DatatypeInfo Source #

Methods

datatypeInfo :: proxy (First a) -> DatatypeInfo (Code (First a)) Source #

HasDatatypeInfo (Last a) Source # 

Associated Types

type DatatypeInfoOf (Last a) :: DatatypeInfo Source #

Methods

datatypeInfo :: proxy (Last a) -> DatatypeInfo (Code (Last a)) Source #

HasDatatypeInfo (Down a) Source # 

Associated Types

type DatatypeInfoOf (Down a) :: DatatypeInfo Source #

Methods

datatypeInfo :: proxy (Down a) -> DatatypeInfo (Code (Down a)) Source #

HasDatatypeInfo (I a) Source # 

Associated Types

type DatatypeInfoOf (I a) :: DatatypeInfo Source #

Methods

datatypeInfo :: proxy (I a) -> DatatypeInfo (Code (I a)) Source #

Generic [a] Source # 

Associated Types

type Code [a] :: [[*]] Source #

Methods

from :: [a] -> Rep [a] Source #

to :: Rep [a] -> [a] Source #

Generic (Maybe a) Source # 

Associated Types

type Code (Maybe a) :: [[*]] Source #

Methods

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

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

Generic (Complex a) Source # 

Associated Types

type Code (Complex a) :: [[*]] Source #

Methods

from :: Complex a -> Rep (Complex a) Source #

to :: Rep (Complex a) -> Complex a Source #

Generic (Fixed a) Source # 

Associated Types

type Code (Fixed a) :: [[*]] Source #

Methods

from :: Fixed a -> Rep (Fixed a) Source #

to :: Rep (Fixed a) -> Fixed a Source #

Generic (ArgOrder a) Source # 

Associated Types

type Code (ArgOrder a) :: [[*]] Source #

Methods

from :: ArgOrder a -> Rep (ArgOrder a) Source #

to :: Rep (ArgOrder a) -> ArgOrder a Source #

Generic (OptDescr a) Source # 

Associated Types

type Code (OptDescr a) :: [[*]] Source #

Methods

from :: OptDescr a -> Rep (OptDescr a) Source #

to :: Rep (OptDescr a) -> OptDescr a Source #

Generic (ArgDescr a) Source # 

Associated Types

type Code (ArgDescr a) :: [[*]] Source #

Methods

from :: ArgDescr a -> Rep (ArgDescr a) Source #

to :: Rep (ArgDescr a) -> ArgDescr a Source #

Generic (Dual a) Source # 

Associated Types

type Code (Dual a) :: [[*]] Source #

Methods

from :: Dual a -> Rep (Dual a) Source #

to :: Rep (Dual a) -> Dual a Source #

Generic (Endo a) Source # 

Associated Types

type Code (Endo a) :: [[*]] Source #

Methods

from :: Endo a -> Rep (Endo a) Source #

to :: Rep (Endo a) -> Endo a Source #

Generic (Sum a) Source # 

Associated Types

type Code (Sum a) :: [[*]] Source #

Methods

from :: Sum a -> Rep (Sum a) Source #

to :: Rep (Sum a) -> Sum a Source #

Generic (Product a) Source # 

Associated Types

type Code (Product a) :: [[*]] Source #

Methods

from :: Product a -> Rep (Product a) Source #

to :: Rep (Product a) -> Product a Source #

Generic (First a) Source # 

Associated Types

type Code (First a) :: [[*]] Source #

Methods

from :: First a -> Rep (First a) Source #

to :: Rep (First a) -> First a Source #

Generic (Last a) Source # 

Associated Types

type Code (Last a) :: [[*]] Source #

Methods

from :: Last a -> Rep (Last a) Source #

to :: Rep (Last a) -> Last a Source #

Generic (Down a) Source # 

Associated Types

type Code (Down a) :: [[*]] Source #

Methods

from :: Down a -> Rep (Down a) Source #

to :: Rep (Down a) -> Down a Source #

Generic (I a) Source # 

Associated Types

type Code (I a) :: [[*]] Source #

Methods

from :: I a -> Rep (I a) Source #

to :: Rep (I a) -> I a Source #

HasDatatypeInfo (Either a b) Source # 

Associated Types

type DatatypeInfoOf (Either a b) :: DatatypeInfo Source #

Methods

datatypeInfo :: proxy (Either a b) -> DatatypeInfo (Code (Either a b)) Source #

HasDatatypeInfo (a, b) Source # 

Associated Types

type DatatypeInfoOf (a, b) :: DatatypeInfo Source #

Methods

datatypeInfo :: proxy (a, b) -> DatatypeInfo (Code (a, b)) Source #

HasDatatypeInfo (Proxy * t) Source # 

Associated Types

type DatatypeInfoOf (Proxy * t) :: DatatypeInfo Source #

Methods

datatypeInfo :: proxy (Proxy * t) -> DatatypeInfo (Code (Proxy * t)) Source #

Generic (Either a b) Source # 

Associated Types

type Code (Either a b) :: [[*]] Source #

Methods

from :: Either a b -> Rep (Either a b) Source #

to :: Rep (Either a b) -> Either a b Source #

Generic (a, b) Source # 

Associated Types

type Code (a, b) :: [[*]] Source #

Methods

from :: (a, b) -> Rep (a, b) Source #

to :: Rep (a, b) -> (a, b) Source #

Generic (Proxy * t) Source # 

Associated Types

type Code (Proxy * t) :: [[*]] Source #

Methods

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

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

HasDatatypeInfo (a, b, c) Source # 

Associated Types

type DatatypeInfoOf (a, b, c) :: DatatypeInfo Source #

Methods

datatypeInfo :: proxy (a, b, c) -> DatatypeInfo (Code (a, b, c)) Source #

HasDatatypeInfo (K * a b) Source # 

Associated Types

type DatatypeInfoOf (K * a b) :: DatatypeInfo Source #

Methods

datatypeInfo :: proxy (K * a b) -> DatatypeInfo (Code (K * a b)) Source #

Generic (a, b, c) Source # 

Associated Types

type Code (a, b, c) :: [[*]] Source #

Methods

from :: (a, b, c) -> Rep (a, b, c) Source #

to :: Rep (a, b, c) -> (a, b, c) Source #

Generic (K * a b) Source # 

Associated Types

type Code (K * a b) :: [[*]] Source #

Methods

from :: K * a b -> Rep (K * a b) Source #

to :: Rep (K * a b) -> K * a b Source #

HasDatatypeInfo (a, b, c, d) Source # 

Associated Types

type DatatypeInfoOf (a, b, c, d) :: DatatypeInfo Source #

Methods

datatypeInfo :: proxy (a, b, c, d) -> DatatypeInfo (Code (a, b, c, d)) Source #

Generic (a, b, c, d) Source # 

Associated Types

type Code (a, b, c, d) :: [[*]] Source #

Methods

from :: (a, b, c, d) -> Rep (a, b, c, d) Source #

to :: Rep (a, b, c, d) -> (a, b, c, d) Source #

HasDatatypeInfo (a, b, c, d, e) Source # 

Associated Types

type DatatypeInfoOf (a, b, c, d, e) :: DatatypeInfo Source #

Methods

datatypeInfo :: proxy (a, b, c, d, e) -> DatatypeInfo (Code (a, b, c, d, e)) Source #

HasDatatypeInfo ((:.:) * * f g p) Source # 

Associated Types

type DatatypeInfoOf ((* :.: *) f g p) :: DatatypeInfo Source #

Methods

datatypeInfo :: proxy ((* :.: *) f g p) -> DatatypeInfo (Code ((* :.: *) f g p)) Source #

Generic (a, b, c, d, e) Source # 

Associated Types

type Code (a, b, c, d, e) :: [[*]] Source #

Methods

from :: (a, b, c, d, e) -> Rep (a, b, c, d, e) Source #

to :: Rep (a, b, c, d, e) -> (a, b, c, d, e) Source #

Generic ((:.:) * * f g p) Source # 

Associated Types

type Code ((* :.: *) f g p) :: [[*]] Source #

Methods

from :: (* :.: *) f g p -> Rep ((* :.: *) f g p) Source #

to :: Rep ((* :.: *) f g p) -> (* :.: *) f g p Source #

HasDatatypeInfo (a, b, c, d, e, f) Source # 

Associated Types

type DatatypeInfoOf (a, b, c, d, e, f) :: DatatypeInfo Source #

Methods

datatypeInfo :: proxy (a, b, c, d, e, f) -> DatatypeInfo (Code (a, b, c, d, e, f)) Source #

Generic (a, b, c, d, e, f) Source # 

Associated Types

type Code (a, b, c, d, e, f) :: [[*]] Source #

Methods

from :: (a, b, c, d, e, f) -> Rep (a, b, c, d, e, f) Source #

to :: Rep (a, b, c, d, e, f) -> (a, b, c, d, e, f) Source #

HasDatatypeInfo (a, b, c, d, e, f, g) Source # 

Associated Types

type DatatypeInfoOf (a, b, c, d, e, f, g) :: DatatypeInfo Source #

Methods

datatypeInfo :: proxy (a, b, c, d, e, f, g) -> DatatypeInfo (Code (a, b, c, d, e, f, g)) Source #

Generic (a, b, c, d, e, f, g) Source # 

Associated Types

type Code (a, b, c, d, e, f, g) :: [[*]] Source #

Methods

from :: (a, b, c, d, e, f, g) -> Rep (a, b, c, d, e, f, g) Source #

to :: Rep (a, b, c, d, e, f, g) -> (a, b, c, d, e, f, g) Source #

HasDatatypeInfo (a, b, c, d, e, f, g, h) Source # 

Associated Types

type DatatypeInfoOf (a, b, c, d, e, f, g, h) :: DatatypeInfo Source #

Methods

datatypeInfo :: proxy (a, b, c, d, e, f, g, h) -> DatatypeInfo (Code (a, b, c, d, e, f, g, h)) Source #

Generic (a, b, c, d, e, f, g, h) Source # 

Associated Types

type Code (a, b, c, d, e, f, g, h) :: [[*]] Source #

Methods

from :: (a, b, c, d, e, f, g, h) -> Rep (a, b, c, d, e, f, g, h) Source #

to :: Rep (a, b, c, d, e, f, g, h) -> (a, b, c, d, e, f, g, h) Source #

HasDatatypeInfo (a, b, c, d, e, f, g, h, i) Source # 

Associated Types

type DatatypeInfoOf (a, b, c, d, e, f, g, h, i) :: DatatypeInfo Source #

Methods

datatypeInfo :: proxy (a, b, c, d, e, f, g, h, i) -> DatatypeInfo (Code (a, b, c, d, e, f, g, h, i)) Source #

Generic (a, b, c, d, e, f, g, h, i) Source # 

Associated Types

type Code (a, b, c, d, e, f, g, h, i) :: [[*]] Source #

Methods

from :: (a, b, c, d, e, f, g, h, i) -> Rep (a, b, c, d, e, f, g, h, i) Source #

to :: Rep (a, b, c, d, e, f, g, h, i) -> (a, b, c, d, e, f, g, h, i) Source #

HasDatatypeInfo (a, b, c, d, e, f, g, h, i, j) Source # 

Associated Types

type DatatypeInfoOf (a, b, c, d, e, f, g, h, i, j) :: DatatypeInfo Source #

Methods

datatypeInfo :: proxy (a, b, c, d, e, f, g, h, i, j) -> DatatypeInfo (Code (a, b, c, d, e, f, g, h, i, j)) Source #

Generic (a, b, c, d, e, f, g, h, i, j) Source # 

Associated Types

type Code (a, b, c, d, e, f, g, h, i, j) :: [[*]] Source #

Methods

from :: (a, b, c, d, e, f, g, h, i, j) -> Rep (a, b, c, d, e, f, g, h, i, j) Source #

to :: Rep (a, b, c, d, e, f, g, h, i, j) -> (a, b, c, d, e, f, g, h, i, j) Source #

HasDatatypeInfo (a, b, c, d, e, f, g, h, i, j, k) Source # 

Associated Types

type DatatypeInfoOf (a, b, c, d, e, f, g, h, i, j, k) :: DatatypeInfo Source #

Methods

datatypeInfo :: proxy (a, b, c, d, e, f, g, h, i, j, k) -> DatatypeInfo (Code (a, b, c, d, e, f, g, h, i, j, k)) Source #

Generic (a, b, c, d, e, f, g, h, i, j, k) Source # 

Associated Types

type Code (a, b, c, d, e, f, g, h, i, j, k) :: [[*]] Source #

Methods

from :: (a, b, c, d, e, f, g, h, i, j, k) -> Rep (a, b, c, d, e, f, g, h, i, j, k) Source #

to :: Rep (a, b, c, d, e, f, g, h, i, j, k) -> (a, b, c, d, e, f, g, h, i, j, k) Source #

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

Associated Types

type DatatypeInfoOf (a, b, c, d, e, f, g, h, i, j, k, l) :: DatatypeInfo Source #

Methods

datatypeInfo :: proxy (a, b, c, d, e, f, g, h, i, j, k, l) -> DatatypeInfo (Code (a, b, c, d, e, f, g, h, i, j, k, l)) Source #

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

Associated Types

type Code (a, b, c, d, e, f, g, h, i, j, k, l) :: [[*]] Source #

Methods

from :: (a, b, c, d, e, f, g, h, i, j, k, l) -> Rep (a, b, c, d, e, f, g, h, i, j, k, l) Source #

to :: Rep (a, b, c, d, e, f, g, h, i, j, k, l) -> (a, b, c, d, e, f, g, h, i, j, k, l) Source #

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

Associated Types

type DatatypeInfoOf (a, b, c, d, e, f, g, h, i, j, k, l, m) :: DatatypeInfo Source #

Methods

datatypeInfo :: proxy (a, b, c, d, e, f, g, h, i, j, k, l, m) -> DatatypeInfo (Code (a, b, c, d, e, f, g, h, i, j, k, l, m)) Source #

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

Associated Types

type Code (a, b, c, d, e, f, g, h, i, j, k, l, m) :: [[*]] Source #

Methods

from :: (a, b, c, d, e, f, g, h, i, j, k, l, m) -> Rep (a, b, c, d, e, f, g, h, i, j, k, l, m) Source #

to :: Rep (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) Source #

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

Associated Types

type DatatypeInfoOf (a, b, c, d, e, f, g, h, i, j, k, l, m, n) :: DatatypeInfo Source #

Methods

datatypeInfo :: proxy (a, b, c, d, e, f, g, h, i, j, k, l, m, n) -> DatatypeInfo (Code (a, b, c, d, e, f, g, h, i, j, k, l, m, n)) Source #

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

Associated Types

type Code (a, b, c, d, e, f, g, h, i, j, k, l, m, n) :: [[*]] Source #

Methods

from :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n) -> Rep (a, b, c, d, e, f, g, h, i, j, k, l, m, n) Source #

to :: Rep (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) Source #

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

Associated Types

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

Methods

datatypeInfo :: proxy (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) -> DatatypeInfo (Code (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o)) Source #

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

Associated Types

type Code (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) :: [[*]] Source #

Methods

from :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) -> Rep (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) Source #

to :: Rep (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) Source #

HasDatatypeInfo (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p) Source # 

Associated Types

type DatatypeInfoOf (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p) :: DatatypeInfo Source #

Methods

datatypeInfo :: proxy (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p) -> DatatypeInfo (Code (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p)) Source #

Generic (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p) Source # 

Associated Types

type Code (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p) :: [[*]] Source #

Methods

from :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p) -> Rep (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p) Source #

to :: Rep (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p) Source #

HasDatatypeInfo (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q) Source # 

Associated Types

type DatatypeInfoOf (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q) :: DatatypeInfo Source #

Methods

datatypeInfo :: proxy (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q) -> DatatypeInfo (Code (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q)) Source #

Generic (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q) Source # 

Associated Types

type Code (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q) :: [[*]] Source #

Methods

from :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q) -> Rep (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q) Source #

to :: Rep (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q) Source #

HasDatatypeInfo (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r) Source # 

Associated Types

type DatatypeInfoOf (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r) :: DatatypeInfo Source #

Methods

datatypeInfo :: proxy (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r) -> DatatypeInfo (Code (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r)) Source #

Generic (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r) Source # 

Associated Types

type Code (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r) :: [[*]] Source #

Methods

from :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r) -> Rep (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r) Source #

to :: Rep (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r) Source #

HasDatatypeInfo (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s) Source # 

Associated Types

type DatatypeInfoOf (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s) :: DatatypeInfo Source #

Methods

datatypeInfo :: proxy (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s) -> DatatypeInfo (Code (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s)) Source #

Generic (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s) Source # 

Associated Types

type Code (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s) :: [[*]] Source #

Methods

from :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s) -> Rep (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s) Source #

to :: Rep (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s) Source #

HasDatatypeInfo (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t) Source # 

Associated Types

type DatatypeInfoOf (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t) :: DatatypeInfo Source #

Methods

datatypeInfo :: proxy (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t) -> DatatypeInfo (Code (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t)) Source #

Generic (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t) Source # 

Associated Types

type Code (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t) :: [[*]] Source #

Methods

from :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t) -> Rep (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t) Source #

to :: Rep (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t) Source #

HasDatatypeInfo (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u) Source # 

Associated Types

type DatatypeInfoOf (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u) :: DatatypeInfo Source #

Methods

datatypeInfo :: proxy (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u) -> DatatypeInfo (Code (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u)) Source #

Generic (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u) Source # 

Associated Types

type Code (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u) :: [[*]] Source #

Methods

from :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u) -> Rep (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u) Source #

to :: Rep (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u) Source #

HasDatatypeInfo (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v) Source # 

Associated Types

type DatatypeInfoOf (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v) :: DatatypeInfo Source #

Methods

datatypeInfo :: proxy (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v) -> DatatypeInfo (Code (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v)) Source #

Generic (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v) Source # 

Associated Types

type Code (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v) :: [[*]] Source #

Methods

from :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v) -> Rep (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v) Source #

to :: Rep (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v) Source #

HasDatatypeInfo (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v, w) Source # 

Associated Types

type DatatypeInfoOf (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v, w) :: DatatypeInfo Source #

Methods

datatypeInfo :: proxy (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v, w) -> DatatypeInfo (Code (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v, w)) Source #

Generic (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v, w) Source # 

Associated Types

type Code (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v, w) :: [[*]] Source #

Methods

from :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v, w) -> Rep (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v, w) Source #

to :: Rep (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v, w) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v, w) Source #

HasDatatypeInfo (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v, w, x) Source # 

Associated Types

type DatatypeInfoOf (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v, w, x) :: DatatypeInfo Source #

Methods

datatypeInfo :: proxy (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v, w, x) -> DatatypeInfo (Code (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v, w, x)) Source #

Generic (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v, w, x) Source # 

Associated Types

type Code (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v, w, x) :: [[*]] Source #

Methods

from :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v, w, x) -> Rep (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v, w, x) Source #

to :: Rep (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v, w, x) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v, w, x) Source #

HasDatatypeInfo (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v, w, x, y) Source # 

Associated Types

type DatatypeInfoOf (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v, w, x, y) :: DatatypeInfo Source #

Methods

datatypeInfo :: proxy (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v, w, x, y) -> DatatypeInfo (Code (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v, w, x, y)) Source #

Generic (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v, w, x, y) Source # 

Associated Types

type Code (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v, w, x, y) :: [[*]] Source #

Methods

from :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v, w, x, y) -> Rep (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v, w, x, y) Source #

to :: Rep (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v, w, x, y) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v, w, x, y) Source #

HasDatatypeInfo (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v, w, x, y, z) Source # 

Associated Types

type DatatypeInfoOf (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v, w, x, y, z) :: DatatypeInfo Source #

Methods

datatypeInfo :: proxy (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v, w, x, y, z) -> DatatypeInfo (Code (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v, w, x, y, z)) Source #

Generic (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v, w, x, y, z) Source # 

Associated Types

type Code (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v, w, x, y, z) :: [[*]] Source #

Methods

from :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v, w, x, y, z) -> Rep (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v, w, x, y, z) Source #

to :: Rep (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v, w, x, y, z) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v, w, x, y, z) Source #

HasDatatypeInfo (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v, w, x, y, z, t26) Source # 

Associated Types

type DatatypeInfoOf (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v, w, x, y, z, t26) :: DatatypeInfo Source #

Methods

datatypeInfo :: proxy (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v, w, x, y, z, t26) -> DatatypeInfo (Code (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v, w, x, y, z, t26)) Source #

Generic (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v, w, x, y, z, t26) Source # 

Associated Types

type Code (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v, w, x, y, z, t26) :: [[*]] Source #

Methods

from :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v, w, x, y, z, t26) -> Rep (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v, w, x, y, z, t26) Source #

to :: Rep (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v, w, x, y, z, t26) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v, w, x, y, z, t26) Source #

HasDatatypeInfo (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v, w, x, y, z, t26, t27) Source # 

Associated Types

type DatatypeInfoOf (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v, w, x, y, z, t26, t27) :: DatatypeInfo Source #

Methods

datatypeInfo :: proxy (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v, w, x, y, z, t26, t27) -> DatatypeInfo (Code (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v, w, x, y, z, t26, t27)) Source #

Generic (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v, w, x, y, z, t26, t27) Source # 

Associated Types

type Code (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v, w, x, y, z, t26, t27) :: [[*]] Source #

Methods

from :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v, w, x, y, z, t26, t27) -> Rep (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v, w, x, y, z, t26, t27) Source #

to :: Rep (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v, w, x, y, z, t26, t27) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v, w, x, y, z, t26, t27) Source #

HasDatatypeInfo (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v, w, x, y, z, t26, t27, t28) Source # 

Associated Types

type DatatypeInfoOf (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v, w, x, y, z, t26, t27, t28) :: DatatypeInfo Source #

Methods

datatypeInfo :: proxy (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v, w, x, y, z, t26, t27, t28) -> DatatypeInfo (Code (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v, w, x, y, z, t26, t27, t28)) Source #

Generic (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v, w, x, y, z, t26, t27, t28) Source # 

Associated Types

type Code (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v, w, x, y, z, t26, t27, t28) :: [[*]] Source #

Methods

from :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v, w, x, y, z, t26, t27, t28) -> Rep (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v, w, x, y, z, t26, t27, t28) Source #

to :: Rep (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v, w, x, y, z, t26, t27, t28) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v, w, x, y, z, t26, t27, t28) Source #

HasDatatypeInfo (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v, w, x, y, z, t26, t27, t28, t29) Source # 

Associated Types

type DatatypeInfoOf (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v, w, x, y, z, t26, t27, t28, t29) :: DatatypeInfo Source #

Methods

datatypeInfo :: proxy (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v, w, x, y, z, t26, t27, t28, t29) -> DatatypeInfo (Code (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v, w, x, y, z, t26, t27, t28, t29)) Source #

Generic (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v, w, x, y, z, t26, t27, t28, t29) Source # 

Associated Types

type Code (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v, w, x, y, z, t26, t27, t28, t29) :: [[*]] Source #

Methods

from :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v, w, x, y, z, t26, t27, t28, t29) -> Rep (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v, w, x, y, z, t26, t27, t28, t29) Source #

to :: Rep (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v, w, x, y, z, t26, t27, t28, t29) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t, u, v, w, x, y, z, t26, t27, t28, t29) Source #