Safe Haskell | None |
---|---|
Language | Haskell98 |
- class Show' s where
- class OutputFiles t where
- data PR a = PR (Program a)
- srcSpanToSrcLocs :: SrcSpan -> (SrcLoc, SrcLoc)
- refactoringForPar :: Typeable a => [String] -> SrcLoc -> a -> State Int (String, SrcLoc, Bool)
- changeDir :: Eq a => [a] -> [a] -> [a] -> [a]
- outputAnalysisFiles :: FileOrDir -> [Program Annotation] -> [Filename] -> IO ()
- refactoringLF :: (Typeable a, Monad m) => [String] -> SrcLoc -> a -> StateT Int m (String, SrcLoc, Bool)
- refactorFortran :: Monad m => [String] -> SrcLoc -> Fortran Annotation -> StateT Int m (String, SrcLoc, Bool)
- refactorDecl :: Monad m => [String] -> SrcLoc -> Decl Annotation -> StateT Int m (String, SrcLoc, Bool)
- refactorArgName :: Monad m => [String] -> SrcLoc -> ArgName Annotation -> m (String, SrcLoc, Bool)
- refactorUses :: Monad m => [String] -> SrcLoc -> Uses Annotation -> StateT Int m (String, SrcLoc, Bool)
- countLines :: Num t => [Char] -> t
- removeNewLines :: (Num t, Eq t) => [Char] -> t -> ([Char], t)
Documentation
class OutputFiles t where Source #
mkOutputText :: FileOrDir -> t -> SourceText Source #
Given a directory and list of triples of filenames, with their source text (if it exists) and their AST, write these to the directory
outputFile :: t -> Filename Source #
outputFiles :: FileOrDir -> FileOrDir -> [t] -> IO () Source #
OutputFiles (Filename, SourceText) Source # | |
OutputFiles (Filename, SourceText, Program Annotation) Source # | |
OutputFiles (Filename, SourceText, ProgramFile Annotation) Source # | |
Data a => Data (PR a) Source # | |
PrettyPrint (PR Annotation) Source # | |
srcSpanToSrcLocs :: SrcSpan -> (SrcLoc, SrcLoc) Source #
refactoringForPar :: Typeable a => [String] -> SrcLoc -> a -> State Int (String, SrcLoc, Bool) 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)
refactoringLF :: (Typeable a, Monad m) => [String] -> SrcLoc -> a -> StateT Int m (String, SrcLoc, Bool) Source #
refactorFortran :: Monad m => [String] -> SrcLoc -> Fortran Annotation -> StateT Int m (String, SrcLoc, Bool) Source #
refactorDecl :: Monad m => [String] -> SrcLoc -> Decl Annotation -> StateT Int m (String, SrcLoc, Bool) Source #
refactorArgName :: Monad m => [String] -> SrcLoc -> ArgName Annotation -> m (String, SrcLoc, Bool) Source #
refactorUses :: Monad m => [String] -> SrcLoc -> Uses Annotation -> StateT Int m (String, SrcLoc, Bool) Source #
countLines :: Num t => [Char] -> t Source #
Orphan instances
PrettyPrint (ProgramFile Annotation) Source # | |