syb-with-class-0.6.1.8: Scrap Your Boilerplate With Class

Safe HaskellNone
LanguageHaskell98

Data.Generics.SYB.WithClass.Basics

Synopsis

Documentation

data Proxy a Source #

class (Typeable a, Sat (ctx a)) => Data ctx a where Source #

Minimal complete definition

toConstr

Methods

gfoldl :: Proxy ctx -> (forall b c. Data ctx b => w (b -> c) -> b -> w c) -> (forall g. g -> w g) -> a -> w a Source #

gunfold :: Proxy ctx -> (forall b r. Data ctx b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c a Source #

toConstr :: Proxy ctx -> a -> Constr Source #

dataTypeOf :: Proxy ctx -> a -> DataType Source #

dataCast1 :: Typeable1 t => Proxy ctx -> (forall b. Data ctx b => w (t b)) -> Maybe (w a) Source #

Mediate types and unary type constructors

dataCast2 :: Typeable2 t => Proxy ctx -> (forall b c. (Data ctx b, Data ctx c) => w (t b c)) -> Maybe (w a) Source #

Mediate types and binary type constructors

type GenericT ctx = forall a. Data ctx a => a -> a Source #

gmapT :: Proxy ctx -> GenericT ctx -> GenericT ctx Source #

newtype ID x Source #

Constructors

ID 

Fields

type GenericM m ctx = forall a. Data ctx a => a -> m a Source #

gmapM :: Monad m => Proxy ctx -> GenericM m ctx -> GenericM m ctx Source #

type GenericQ ctx r = forall a. Data ctx a => a -> r Source #

gmapQ :: Proxy ctx -> GenericQ ctx r -> GenericQ ctx [r] Source #

gmapQr :: Data ctx a => Proxy ctx -> (r' -> r -> r) -> r -> GenericQ ctx r' -> a -> r Source #

newtype Qr r a Source #

Constructors

Qr 

Fields

fromConstr :: Data ctx a => Proxy ctx -> Constr -> a Source #

Build a term skeleton

fromConstrB :: Data ctx a => Proxy ctx -> (forall b. Data ctx b => b) -> Constr -> a Source #

Build a term and use a generic function for subterms

fromConstrM :: (Monad m, Data ctx a) => Proxy ctx -> (forall b. Data ctx b => m b) -> Constr -> m a Source #

Monadic variation on "fromConstrB"

data DataType Source #

Representation of datatypes. | A package of constructor representations with names of type and module. | The list of constructors could be an array, a balanced tree, or others.

Constructors

DataType 

Fields

data Constr Source #

Representation of constructors

Instances

Eq Constr Source #

Equality of constructors

Methods

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

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

Show Constr Source # 

data DataRep Source #

Public representation of datatypes

type ConIndex = Int Source #

Unique index for datatype constructors. | Textual order is respected. Starts at 1.

data Fixity Source #

Fixity of constructors

Constructors

Prefix 
Infix 

Instances

dataTypeName :: DataType -> String Source #

Gets the type constructor including the module

dataTypeRep :: DataType -> DataRep Source #

Gets the public presentation of datatypes

constrType :: Constr -> DataType Source #

Gets the datatype of a constructor

constrRep :: Constr -> ConstrRep Source #

Gets the public presentation of constructors

repConstr :: DataType -> ConstrRep -> Constr Source #

Look up a constructor by its representation

mkDataType :: String -> [Constr] -> DataType Source #

Constructs an algebraic datatype

mkConstr :: DataType -> String -> [String] -> Fixity -> Constr Source #

Constructs a constructor

dataTypeConstrs :: DataType -> [Constr] Source #

Gets the constructors

constrFields :: Constr -> [String] Source #

Gets the field labels of a constructor

constrFixity :: Constr -> Fixity Source #

Gets the fixity of a constructor

showConstr :: Constr -> String Source #

Gets the string for a constructor

readConstr :: DataType -> String -> Maybe Constr Source #

Lookup a constructor via a string

isAlgType :: DataType -> Bool Source #

Test for an algebraic type

indexConstr :: DataType -> ConIndex -> Constr Source #

Gets the constructor for an index

constrIndex :: Constr -> ConIndex Source #

Gets the index of a constructor

maxConstrIndex :: DataType -> ConIndex Source #

Gets the maximum constructor index

mkIntType :: String -> DataType Source #

Constructs the Int type

mkFloatType :: String -> DataType Source #

Constructs the Float type

mkStringType :: String -> DataType Source #

Constructs the String type

mkPrimType :: DataRep -> String -> DataType Source #

Helper for mkIntType, mkFloatType, mkStringType

mkNorepType :: String -> DataType Source #

Constructs a non-representation

isNorepType :: DataType -> Bool Source #

Test for a non-representable type