generics-sop-0.2.3.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 # 
HasDatatypeInfo Ordering Source # 
HasDatatypeInfo () Source # 

Methods

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

HasDatatypeInfo FormatAdjustment Source # 
HasDatatypeInfo FormatSign Source # 
HasDatatypeInfo FieldFormat Source # 
HasDatatypeInfo FormatParse Source # 
HasDatatypeInfo DataRep Source # 
HasDatatypeInfo ConstrRep Source # 
HasDatatypeInfo Fixity 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 # 
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 CChar Source # 
HasDatatypeInfo CSChar Source # 
HasDatatypeInfo CUChar Source # 
HasDatatypeInfo CShort Source # 
HasDatatypeInfo CUShort Source # 
HasDatatypeInfo CInt Source # 
HasDatatypeInfo CUInt Source # 
HasDatatypeInfo CLong Source # 
HasDatatypeInfo CULong Source # 
HasDatatypeInfo CLLong Source # 
HasDatatypeInfo CULLong Source # 
HasDatatypeInfo CFloat Source # 
HasDatatypeInfo CDouble Source # 
HasDatatypeInfo CPtrdiff Source # 
HasDatatypeInfo CSize Source # 
HasDatatypeInfo CWchar Source # 
HasDatatypeInfo CSigAtomic Source # 
HasDatatypeInfo CClock Source # 
HasDatatypeInfo CTime Source # 
HasDatatypeInfo CUSeconds Source # 
HasDatatypeInfo CSUSeconds Source # 
HasDatatypeInfo CIntPtr Source # 
HasDatatypeInfo CUIntPtr Source # 
HasDatatypeInfo CIntMax Source # 
HasDatatypeInfo CUIntMax Source # 
HasDatatypeInfo SeekMode Source # 
HasDatatypeInfo All Source # 
HasDatatypeInfo Any Source # 
HasDatatypeInfo MaskingState Source # 
HasDatatypeInfo IOException Source # 
HasDatatypeInfo ErrorCall Source # 
HasDatatypeInfo ArithException 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 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 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 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 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 SeekMode Source # 

Associated Types

type Code SeekMode :: [[*]] 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 MaskingState Source # 
Generic IOException Source # 

Associated Types

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

Generic ErrorCall Source # 

Associated Types

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

Generic ArithException 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 [a0] Source # 

Methods

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

HasDatatypeInfo (Maybe a0) Source # 

Methods

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

HasDatatypeInfo (Fixed a0) Source # 

Methods

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

HasDatatypeInfo (Complex a0) Source # 

Methods

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

HasDatatypeInfo (ArgOrder a0) Source # 

Methods

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

HasDatatypeInfo (OptDescr a0) Source # 

Methods

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

HasDatatypeInfo (ArgDescr a0) Source # 

Methods

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

HasDatatypeInfo (Dual a0) Source # 

Methods

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

HasDatatypeInfo (Endo a0) Source # 

Methods

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

HasDatatypeInfo (Sum a0) Source # 

Methods

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

HasDatatypeInfo (Product a0) Source # 

Methods

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

HasDatatypeInfo (First a0) Source # 

Methods

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

HasDatatypeInfo (Last a0) Source # 

Methods

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

HasDatatypeInfo (Down a0) Source # 

Methods

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

HasDatatypeInfo (I a0) Source # 

Methods

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

Generic [a0] Source # 

Associated Types

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

Methods

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

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

Generic (Maybe a0) Source # 

Associated Types

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

Methods

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

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

Generic (Fixed a0) Source # 

Associated Types

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

Methods

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

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

Generic (Complex a0) Source # 

Associated Types

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

Methods

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

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

Generic (ArgOrder a0) Source # 

Associated Types

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

Methods

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

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

Generic (OptDescr a0) Source # 

Associated Types

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

Methods

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

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

Generic (ArgDescr a0) Source # 

Associated Types

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

Methods

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

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

Generic (Dual a0) Source # 

Associated Types

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

Methods

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

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

Generic (Endo a0) Source # 

Associated Types

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

Methods

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

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

Generic (Sum a0) Source # 

Associated Types

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

Methods

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

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

Generic (Product a0) Source # 

Associated Types

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

Methods

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

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

Generic (First a0) Source # 

Associated Types

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

Methods

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

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

Generic (Last a0) Source # 

Associated Types

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

Methods

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

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

Generic (Down a0) Source # 

Associated Types

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

Methods

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

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

Generic (I a0) Source # 

Associated Types

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

Methods

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

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

HasDatatypeInfo (Either a0 b0) Source # 

Methods

datatypeInfo :: proxy (Either a0 b0) -> DatatypeInfo (Code (Either a0 b0)) Source #

HasDatatypeInfo (a0, b0) Source # 

Methods

datatypeInfo :: proxy (a0, b0) -> DatatypeInfo (Code (a0, b0)) Source #

HasDatatypeInfo (Proxy * t0) Source # 

Methods

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

Generic (Either a0 b0) Source # 

Associated Types

type Code (Either a0 b0) :: [[*]] Source #

Methods

from :: Either a0 b0 -> Rep (Either a0 b0) Source #

to :: Rep (Either a0 b0) -> Either a0 b0 Source #

Generic (a0, b0) Source # 

Associated Types

type Code (a0, b0) :: [[*]] Source #

Methods

from :: (a0, b0) -> Rep (a0, b0) Source #

to :: Rep (a0, b0) -> (a0, b0) Source #

Generic (Proxy * t0) Source # 

Associated Types

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

Methods

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

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

HasDatatypeInfo (a0, b0, c0) Source # 

Methods

datatypeInfo :: proxy (a0, b0, c0) -> DatatypeInfo (Code (a0, b0, c0)) Source #

HasDatatypeInfo (K * a0 b0) Source # 

Methods

datatypeInfo :: proxy (K * a0 b0) -> DatatypeInfo (Code (K * a0 b0)) Source #

Generic (a0, b0, c0) Source # 

Associated Types

type Code (a0, b0, c0) :: [[*]] Source #

Methods

from :: (a0, b0, c0) -> Rep (a0, b0, c0) Source #

to :: Rep (a0, b0, c0) -> (a0, b0, c0) Source #

Generic (K * a0 b0) Source # 

Associated Types

type Code (K * a0 b0) :: [[*]] Source #

Methods

from :: K * a0 b0 -> Rep (K * a0 b0) Source #

to :: Rep (K * a0 b0) -> K * a0 b0 Source #

HasDatatypeInfo (a0, b0, c0, d0) Source # 

Methods

datatypeInfo :: proxy (a0, b0, c0, d0) -> DatatypeInfo (Code (a0, b0, c0, d0)) Source #

Generic (a0, b0, c0, d0) Source # 

Associated Types

type Code (a0, b0, c0, d0) :: [[*]] Source #

Methods

from :: (a0, b0, c0, d0) -> Rep (a0, b0, c0, d0) Source #

to :: Rep (a0, b0, c0, d0) -> (a0, b0, c0, d0) Source #

HasDatatypeInfo (a0, b0, c0, d0, e0) Source # 

Methods

datatypeInfo :: proxy (a0, b0, c0, d0, e0) -> DatatypeInfo (Code (a0, b0, c0, d0, e0)) Source #

HasDatatypeInfo ((:.:) * * f0 g0 p0) Source # 

Methods

datatypeInfo :: proxy ((* :.: *) f0 g0 p0) -> DatatypeInfo (Code ((* :.: *) f0 g0 p0)) Source #

Generic (a0, b0, c0, d0, e0) Source # 

Associated Types

type Code (a0, b0, c0, d0, e0) :: [[*]] Source #

Methods

from :: (a0, b0, c0, d0, e0) -> Rep (a0, b0, c0, d0, e0) Source #

to :: Rep (a0, b0, c0, d0, e0) -> (a0, b0, c0, d0, e0) Source #

Generic ((:.:) * * f0 g0 p0) Source # 

Associated Types

type Code ((:.:) * * f0 g0 p0) :: [[*]] Source #

Methods

from :: (* :.: *) f0 g0 p0 -> Rep ((* :.: *) f0 g0 p0) Source #

to :: Rep ((* :.: *) f0 g0 p0) -> (* :.: *) f0 g0 p0 Source #

HasDatatypeInfo (a0, b0, c0, d0, e0, f0) Source # 

Methods

datatypeInfo :: proxy (a0, b0, c0, d0, e0, f0) -> DatatypeInfo (Code (a0, b0, c0, d0, e0, f0)) Source #

Generic (a0, b0, c0, d0, e0, f0) Source # 

Associated Types

type Code (a0, b0, c0, d0, e0, f0) :: [[*]] Source #

Methods

from :: (a0, b0, c0, d0, e0, f0) -> Rep (a0, b0, c0, d0, e0, f0) Source #

to :: Rep (a0, b0, c0, d0, e0, f0) -> (a0, b0, c0, d0, e0, f0) Source #

HasDatatypeInfo (a0, b0, c0, d0, e0, f0, g0) Source # 

Methods

datatypeInfo :: proxy (a0, b0, c0, d0, e0, f0, g0) -> DatatypeInfo (Code (a0, b0, c0, d0, e0, f0, g0)) Source #

Generic (a0, b0, c0, d0, e0, f0, g0) Source # 

Associated Types

type Code (a0, b0, c0, d0, e0, f0, g0) :: [[*]] Source #

Methods

from :: (a0, b0, c0, d0, e0, f0, g0) -> Rep (a0, b0, c0, d0, e0, f0, g0) Source #

to :: Rep (a0, b0, c0, d0, e0, f0, g0) -> (a0, b0, c0, d0, e0, f0, g0) Source #

HasDatatypeInfo (a0, b0, c0, d0, e0, f0, g0, h0) Source # 

Methods

datatypeInfo :: proxy (a0, b0, c0, d0, e0, f0, g0, h0) -> DatatypeInfo (Code (a0, b0, c0, d0, e0, f0, g0, h0)) Source #

Generic (a0, b0, c0, d0, e0, f0, g0, h0) Source # 

Associated Types

type Code (a0, b0, c0, d0, e0, f0, g0, h0) :: [[*]] Source #

Methods

from :: (a0, b0, c0, d0, e0, f0, g0, h0) -> Rep (a0, b0, c0, d0, e0, f0, g0, h0) Source #

to :: Rep (a0, b0, c0, d0, e0, f0, g0, h0) -> (a0, b0, c0, d0, e0, f0, g0, h0) Source #

HasDatatypeInfo (a0, b0, c0, d0, e0, f0, g0, h0, i0) Source # 

Methods

datatypeInfo :: proxy (a0, b0, c0, d0, e0, f0, g0, h0, i0) -> DatatypeInfo (Code (a0, b0, c0, d0, e0, f0, g0, h0, i0)) Source #

Generic (a0, b0, c0, d0, e0, f0, g0, h0, i0) Source # 

Associated Types

type Code (a0, b0, c0, d0, e0, f0, g0, h0, i0) :: [[*]] Source #

Methods

from :: (a0, b0, c0, d0, e0, f0, g0, h0, i0) -> Rep (a0, b0, c0, d0, e0, f0, g0, h0, i0) Source #

to :: Rep (a0, b0, c0, d0, e0, f0, g0, h0, i0) -> (a0, b0, c0, d0, e0, f0, g0, h0, i0) Source #

HasDatatypeInfo (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0) Source # 

Methods

datatypeInfo :: proxy (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0) -> DatatypeInfo (Code (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0)) Source #

Generic (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0) Source # 

Associated Types

type Code (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0) :: [[*]] Source #

Methods

from :: (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0) -> Rep (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0) Source #

to :: Rep (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0) -> (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0) Source #

HasDatatypeInfo (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0) Source # 

Methods

datatypeInfo :: proxy (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0) -> DatatypeInfo (Code (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0)) Source #

Generic (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0) Source # 

Associated Types

type Code (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0) :: [[*]] Source #

Methods

from :: (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0) -> Rep (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0) Source #

to :: Rep (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0) -> (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0) Source #

HasDatatypeInfo (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0) Source # 

Methods

datatypeInfo :: proxy (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0) -> DatatypeInfo (Code (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0)) Source #

Generic (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0) Source # 

Associated Types

type Code (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0) :: [[*]] Source #

Methods

from :: (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0) -> Rep (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0) Source #

to :: Rep (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0) -> (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0) Source #

HasDatatypeInfo (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0) Source # 

Methods

datatypeInfo :: proxy (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0) -> DatatypeInfo (Code (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0)) Source #

Generic (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0) Source # 

Associated Types

type Code (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0) :: [[*]] Source #

Methods

from :: (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0) -> Rep (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0) Source #

to :: Rep (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0) -> (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0) Source #

HasDatatypeInfo (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0) Source # 

Methods

datatypeInfo :: proxy (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0) -> DatatypeInfo (Code (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0)) Source #

Generic (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0) Source # 

Associated Types

type Code (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0) :: [[*]] Source #

Methods

from :: (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0) -> Rep (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0) Source #

to :: Rep (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0) -> (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0) Source #

HasDatatypeInfo (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0) Source # 

Methods

datatypeInfo :: proxy (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0) -> DatatypeInfo (Code (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0)) Source #

Generic (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0) Source # 

Associated Types

type Code (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0) :: [[*]] Source #

Methods

from :: (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0) -> Rep (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0) Source #

to :: Rep (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0) -> (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0) Source #

HasDatatypeInfo (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0) Source # 

Methods

datatypeInfo :: proxy (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0) -> DatatypeInfo (Code (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0)) Source #

Generic (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0) Source # 

Associated Types

type Code (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0) :: [[*]] Source #

Methods

from :: (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0) -> Rep (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0) Source #

to :: Rep (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0) -> (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0) Source #

HasDatatypeInfo (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0) Source # 

Methods

datatypeInfo :: proxy (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0) -> DatatypeInfo (Code (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0)) Source #

Generic (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0) Source # 

Associated Types

type Code (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0) :: [[*]] Source #

Methods

from :: (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0) -> Rep (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0) Source #

to :: Rep (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0) -> (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0) Source #

HasDatatypeInfo (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0, r0) Source # 

Methods

datatypeInfo :: proxy (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0, r0) -> DatatypeInfo (Code (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0, r0)) Source #

Generic (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0, r0) Source # 

Associated Types

type Code (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0, r0) :: [[*]] Source #

Methods

from :: (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0, r0) -> Rep (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0, r0) Source #

to :: Rep (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0, r0) -> (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0, r0) Source #

HasDatatypeInfo (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0, r0, s0) Source # 

Methods

datatypeInfo :: proxy (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0, r0, s0) -> DatatypeInfo (Code (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0, r0, s0)) Source #

Generic (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0, r0, s0) Source # 

Associated Types

type Code (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0, r0, s0) :: [[*]] Source #

Methods

from :: (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0, r0, s0) -> Rep (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0, r0, s0) Source #

to :: Rep (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0, r0, s0) -> (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0, r0, s0) Source #

HasDatatypeInfo (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0, r0, s0, t0) Source # 

Methods

datatypeInfo :: proxy (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0, r0, s0, t0) -> DatatypeInfo (Code (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0, r0, s0, t0)) Source #

Generic (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0, r0, s0, t0) Source # 

Associated Types

type Code (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0, r0, s0, t0) :: [[*]] Source #

Methods

from :: (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0, r0, s0, t0) -> Rep (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0, r0, s0, t0) Source #

to :: Rep (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0, r0, s0, t0) -> (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0, r0, s0, t0) Source #

HasDatatypeInfo (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0, r0, s0, t0, u0) Source # 

Methods

datatypeInfo :: proxy (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0, r0, s0, t0, u0) -> DatatypeInfo (Code (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0, r0, s0, t0, u0)) Source #

Generic (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0, r0, s0, t0, u0) Source # 

Associated Types

type Code (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0, r0, s0, t0, u0) :: [[*]] Source #

Methods

from :: (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0, r0, s0, t0, u0) -> Rep (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0, r0, s0, t0, u0) Source #

to :: Rep (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0, r0, s0, t0, u0) -> (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0, r0, s0, t0, u0) Source #

HasDatatypeInfo (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0, r0, s0, t0, u0, v0) Source # 

Methods

datatypeInfo :: proxy (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0, r0, s0, t0, u0, v0) -> DatatypeInfo (Code (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0, r0, s0, t0, u0, v0)) Source #

Generic (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0, r0, s0, t0, u0, v0) Source # 

Associated Types

type Code (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0, r0, s0, t0, u0, v0) :: [[*]] Source #

Methods

from :: (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0, r0, s0, t0, u0, v0) -> Rep (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0, r0, s0, t0, u0, v0) Source #

to :: Rep (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0, r0, s0, t0, u0, v0) -> (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0, r0, s0, t0, u0, v0) Source #

HasDatatypeInfo (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0, r0, s0, t0, u0, v0, w0) Source # 

Methods

datatypeInfo :: proxy (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0, r0, s0, t0, u0, v0, w0) -> DatatypeInfo (Code (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0, r0, s0, t0, u0, v0, w0)) Source #

Generic (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0, r0, s0, t0, u0, v0, w0) Source # 

Associated Types

type Code (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0, r0, s0, t0, u0, v0, w0) :: [[*]] Source #

Methods

from :: (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0, r0, s0, t0, u0, v0, w0) -> Rep (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0, r0, s0, t0, u0, v0, w0) Source #

to :: Rep (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0, r0, s0, t0, u0, v0, w0) -> (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0, r0, s0, t0, u0, v0, w0) Source #

HasDatatypeInfo (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0, r0, s0, t0, u0, v0, w0, x0) Source # 

Methods

datatypeInfo :: proxy (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0, r0, s0, t0, u0, v0, w0, x0) -> DatatypeInfo (Code (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0, r0, s0, t0, u0, v0, w0, x0)) Source #

Generic (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0, r0, s0, t0, u0, v0, w0, x0) Source # 

Associated Types

type Code (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0, r0, s0, t0, u0, v0, w0, x0) :: [[*]] Source #

Methods

from :: (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0, r0, s0, t0, u0, v0, w0, x0) -> Rep (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0, r0, s0, t0, u0, v0, w0, x0) Source #

to :: Rep (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0, r0, s0, t0, u0, v0, w0, x0) -> (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0, r0, s0, t0, u0, v0, w0, x0) Source #

HasDatatypeInfo (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0, r0, s0, t0, u0, v0, w0, x0, y0) Source # 

Methods

datatypeInfo :: proxy (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0, r0, s0, t0, u0, v0, w0, x0, y0) -> DatatypeInfo (Code (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0, r0, s0, t0, u0, v0, w0, x0, y0)) Source #

Generic (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0, r0, s0, t0, u0, v0, w0, x0, y0) Source # 

Associated Types

type Code (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0, r0, s0, t0, u0, v0, w0, x0, y0) :: [[*]] Source #

Methods

from :: (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0, r0, s0, t0, u0, v0, w0, x0, y0) -> Rep (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0, r0, s0, t0, u0, v0, w0, x0, y0) Source #

to :: Rep (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0, r0, s0, t0, u0, v0, w0, x0, y0) -> (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0, r0, s0, t0, u0, v0, w0, x0, y0) Source #

HasDatatypeInfo (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0, r0, s0, t0, u0, v0, w0, x0, y0, z0) Source # 

Methods

datatypeInfo :: proxy (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0, r0, s0, t0, u0, v0, w0, x0, y0, z0) -> DatatypeInfo (Code (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0, r0, s0, t0, u0, v0, w0, x0, y0, z0)) Source #

Generic (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0, r0, s0, t0, u0, v0, w0, x0, y0, z0) Source # 

Associated Types

type Code (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0, r0, s0, t0, u0, v0, w0, x0, y0, z0) :: [[*]] Source #

Methods

from :: (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0, r0, s0, t0, u0, v0, w0, x0, y0, z0) -> Rep (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0, r0, s0, t0, u0, v0, w0, x0, y0, z0) Source #

to :: Rep (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0, r0, s0, t0, u0, v0, w0, x0, y0, z0) -> (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0, r0, s0, t0, u0, v0, w0, x0, y0, z0) Source #

HasDatatypeInfo (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0, r0, s0, t0, u0, v0, w0, x0, y0, z0, t280) Source # 

Methods

datatypeInfo :: proxy (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0, r0, s0, t0, u0, v0, w0, x0, y0, z0, t280) -> DatatypeInfo (Code (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0, r0, s0, t0, u0, v0, w0, x0, y0, z0, t280)) Source #

Generic (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0, r0, s0, t0, u0, v0, w0, x0, y0, z0, t280) Source # 

Associated Types

type Code (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0, r0, s0, t0, u0, v0, w0, x0, y0, z0, t280) :: [[*]] Source #

Methods

from :: (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0, r0, s0, t0, u0, v0, w0, x0, y0, z0, t280) -> Rep (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0, r0, s0, t0, u0, v0, w0, x0, y0, z0, t280) Source #

to :: Rep (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0, r0, s0, t0, u0, v0, w0, x0, y0, z0, t280) -> (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0, r0, s0, t0, u0, v0, w0, x0, y0, z0, t280) Source #

HasDatatypeInfo (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0, r0, s0, t0, u0, v0, w0, x0, y0, z0, t280, t290) Source # 

Methods

datatypeInfo :: proxy (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0, r0, s0, t0, u0, v0, w0, x0, y0, z0, t280, t290) -> DatatypeInfo (Code (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0, r0, s0, t0, u0, v0, w0, x0, y0, z0, t280, t290)) Source #

Generic (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0, r0, s0, t0, u0, v0, w0, x0, y0, z0, t280, t290) Source # 

Associated Types

type Code (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0, r0, s0, t0, u0, v0, w0, x0, y0, z0, t280, t290) :: [[*]] Source #

Methods

from :: (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0, r0, s0, t0, u0, v0, w0, x0, y0, z0, t280, t290) -> Rep (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0, r0, s0, t0, u0, v0, w0, x0, y0, z0, t280, t290) Source #

to :: Rep (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0, r0, s0, t0, u0, v0, w0, x0, y0, z0, t280, t290) -> (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0, r0, s0, t0, u0, v0, w0, x0, y0, z0, t280, t290) Source #

HasDatatypeInfo (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0, r0, s0, t0, u0, v0, w0, x0, y0, z0, t280, t290, t300) Source # 

Methods

datatypeInfo :: proxy (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0, r0, s0, t0, u0, v0, w0, x0, y0, z0, t280, t290, t300) -> DatatypeInfo (Code (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0, r0, s0, t0, u0, v0, w0, x0, y0, z0, t280, t290, t300)) Source #

Generic (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0, r0, s0, t0, u0, v0, w0, x0, y0, z0, t280, t290, t300) Source # 

Associated Types

type Code (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0, r0, s0, t0, u0, v0, w0, x0, y0, z0, t280, t290, t300) :: [[*]] Source #

Methods

from :: (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0, r0, s0, t0, u0, v0, w0, x0, y0, z0, t280, t290, t300) -> Rep (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0, r0, s0, t0, u0, v0, w0, x0, y0, z0, t280, t290, t300) Source #

to :: Rep (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0, r0, s0, t0, u0, v0, w0, x0, y0, z0, t280, t290, t300) -> (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0, r0, s0, t0, u0, v0, w0, x0, y0, z0, t280, t290, t300) Source #

HasDatatypeInfo (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0, r0, s0, t0, u0, v0, w0, x0, y0, z0, t280, t290, t300, t310) Source # 

Methods

datatypeInfo :: proxy (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0, r0, s0, t0, u0, v0, w0, x0, y0, z0, t280, t290, t300, t310) -> DatatypeInfo (Code (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0, r0, s0, t0, u0, v0, w0, x0, y0, z0, t280, t290, t300, t310)) Source #

Generic (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0, r0, s0, t0, u0, v0, w0, x0, y0, z0, t280, t290, t300, t310) Source # 

Associated Types

type Code (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0, r0, s0, t0, u0, v0, w0, x0, y0, z0, t280, t290, t300, t310) :: [[*]] Source #

Methods

from :: (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0, r0, s0, t0, u0, v0, w0, x0, y0, z0, t280, t290, t300, t310) -> Rep (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0, r0, s0, t0, u0, v0, w0, x0, y0, z0, t280, t290, t300, t310) Source #

to :: Rep (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0, r0, s0, t0, u0, v0, w0, x0, y0, z0, t280, t290, t300, t310) -> (a0, b0, c0, d0, e0, f0, g0, h0, i0, j0, k0, l0, m0, n0, o0, p0, q0, r0, s0, t0, u0, v0, w0, x0, y0, z0, t280, t290, t300, t310) Source #