camfort-0.802: CamFort - Cambridge Fortran infrastructure

Safe HaskellNone
LanguageHaskell98

Camfort.Output

Contents

Synopsis

Documentation

class Show' s where Source #

Minimal complete definition

show'

Methods

show' :: s -> String Source #

Instances

Show a => Show' a Source # 

Methods

show' :: a -> String Source #

Show' String Source # 

Methods

show' :: String -> String Source #

(Show' a, Show' b) => Show' (a, b) Source # 

Methods

show' :: (a, b) -> String Source #

data PR a Source #

Constructors

PR (Program a) 

Instances

Data a => Data (PR a) Source # 

Methods

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

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

toConstr :: PR a -> Constr #

dataTypeOf :: PR a -> DataType #

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

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

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

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

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

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

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

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

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

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

PrettyPrint (PR Annotation) Source # 

changeDir :: Eq a => [a] -> [a] -> [a] -> [a] Source #

changeDir is used to change the directory of a filename string. If the filename string has no directory then this is an identity

outputAnalysisFiles :: FileOrDir -> [Program Annotation] -> [Filename] -> IO () Source #

output pre-analysis ASTs into the directory with the given file names (the list of ASTs should match the list of filenames)

countLines :: Num t => [Char] -> t Source #

removeNewLines :: (Num t, Eq t) => [Char] -> t -> ([Char], t) Source #

Orphan instances

PrettyPrint (ProgramFile Annotation) Source # 

Methods

prettyPrint :: ProgramFile Annotation -> String Source #