pads-haskell-0.1.0.0: PADS data description language for Haskell.

Copyright(c) 2011
Kathleen Fisher <kathleen.fisher@gmail.com>
John Launchbury <john.launchbury@gmail.com>
LicenseMIT
MaintainerKarl Cronburg <karl@cs.tufts.edu>
Stabilityexperimental
Safe HaskellSafe
LanguageHaskell2010

Language.Pads.RegExp

Description

 
Synopsis

Documentation

data RE Source #

Regular expression support. PADS uses the regex-posix package.

Constructors

RE String

A regular expression printed as its match

REd String String

A regular expression printed as the second arg

Instances
Eq RE Source # 
Instance details

Defined in Language.Pads.RegExp

Methods

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

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

Data RE Source # 
Instance details

Defined in Language.Pads.RegExp

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> RE -> c RE #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c RE #

toConstr :: RE -> Constr #

dataTypeOf :: RE -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c RE) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c RE) #

gmapT :: (forall b. Data b => b -> b) -> RE -> RE #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> RE -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> RE -> r #

gmapQ :: (forall d. Data d => d -> u) -> RE -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> RE -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> RE -> m RE #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> RE -> m RE #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> RE -> m RE #

Show RE Source # 
Instance details

Defined in Language.Pads.RegExp

Methods

showsPrec :: Int -> RE -> ShowS #

show :: RE -> String #

showList :: [RE] -> ShowS #

LitParse RE Source # 
Instance details

Defined in Language.Pads.CoreBaseTypes

ExpSerialize RE Source # 
Instance details

Defined in Language.Pads.CoreBaseTypes