liquidhaskell-0.8.0.3: Liquid Types for Haskell

Safe HaskellNone
LanguageHaskell98

Language.Haskell.Liquid.Parse

Synopsis

Documentation

hsSpecificationP :: ModuleName -> [(SourcePos, String)] -> [BPspec] -> Either [Error] (ModName, BareSpec) Source #

Top Level Parsing API -----------------------------------------------------

Used to parse .hs and .lhs files (via ApiAnnotations)

specSpecificationP :: SourceName -> String -> Either Error (ModName, BareSpec) Source #

Used to parse .spec files

data Pspec ty ctor Source #

Instances

(Data ctor, Data ty) => Data (Pspec ty ctor) Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Pspec ty ctor -> c (Pspec ty ctor) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Pspec ty ctor) #

toConstr :: Pspec ty ctor -> Constr #

dataTypeOf :: Pspec ty ctor -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c (Pspec ty ctor)) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Pspec ty ctor)) #

gmapT :: (forall b. Data b => b -> b) -> Pspec ty ctor -> Pspec ty ctor #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Pspec ty ctor -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Pspec ty ctor -> r #

gmapQ :: (forall d. Data d => d -> u) -> Pspec ty ctor -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Pspec ty ctor -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Pspec ty ctor -> m (Pspec ty ctor) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Pspec ty ctor -> m (Pspec ty ctor) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Pspec ty ctor -> m (Pspec ty ctor) #

(Show ty, PPrint ctor, PPrint ty) => Show (Pspec ty ctor) Source # 

Methods

showsPrec :: Int -> Pspec ty ctor -> ShowS #

show :: Pspec ty ctor -> String #

showList :: [Pspec ty ctor] -> ShowS #