Safe Haskell | None |
---|---|
Language | Haskell2010 |
Hpp
Description
Front-end interface to the pre-processor.
- parseDefinition :: [TOKEN] -> Maybe (String, Macro)
- preprocess :: (Monad m, HppCaps m) => ([String] -> src) -> [String] -> HppT [String] (Parser m [TOKEN]) ()
- hppReadFile :: Monad m => Int -> FilePath -> HppT src m src
- hppIO :: Config -> Env -> ([String] -> IO ()) -> [String] -> IO ()
- type HppCaps t = (HasError t, HasHppState t, HasEnv t)
- hppFileContents :: Config -> Env -> FilePath -> [String] -> IO (Either Error [String])
Documentation
parseDefinition :: [TOKEN] -> Maybe (String, Macro) Source #
Parse the definition of an object-like or function macro.
preprocess :: (Monad m, HppCaps m) => ([String] -> src) -> [String] -> HppT [String] (Parser m [TOKEN]) () Source #
Run a stream of lines through the preprocessor.
hppIO :: Config -> Env -> ([String] -> IO ()) -> [String] -> IO () Source #
General hpp runner against input source file lines. Any errors
encountered are thrown with error
.