camfort-0.802: CamFort - Cambridge Fortran infrastructure
Camfort.Transformation.Syntax
reassociate :: Fortran Annotation -> Fortran Annotation Source #
refactorSpan :: SrcSpan -> SrcSpan Source #
refactorSpanN :: Int -> SrcSpan -> SrcSpan Source #
incLine :: SrcLoc -> SrcLoc Source #
decLine :: SrcLoc -> SrcLoc Source #
incCol :: SrcLoc -> SrcLoc Source #
decCol :: SrcLoc -> SrcLoc Source #
toCol0 :: SrcLoc -> SrcLoc Source #
linesCovered :: SrcLoc -> SrcLoc -> Int Source #
dropLine :: SrcSpan -> SrcSpan Source #
dropLine' :: SrcSpan -> SrcLoc Source #
srcLineCol :: SrcLoc -> (Int, Int) Source #
minaa :: SrcLoc -> SrcLoc Source #
nullLoc :: SrcLoc Source #
nullSpan :: SrcSpan Source #
afterEnd :: SrcSpan -> SrcSpan Source #
caml :: [Char] -> [Char] Source #
type Renamer = Map Variable Variable Source #
type RenamerCoercer = Maybe (Map Variable (Maybe Variable, Maybe (Type A, Type A))) Source #
applyRenaming :: (Typeable (t A), Data (t A)) => Renamer -> t A -> t A Source #
class Renaming r where Source #
Minimal complete definition
hasRenaming
Methods
hasRenaming :: Variable -> r -> Bool Source #
Instances
hasRenaming :: Variable -> RenamerCoercer -> Bool Source #
hasRenaming :: Variable -> [RenamerCoercer] -> Bool Source #