ghc-exactprint-1.7.0.1: ExactPrint for GHC
Safe HaskellSafe-Inferred
LanguageHaskell2010

Language.Haskell.GHC.ExactPrint.Utils

Synopsis

Documentation

debugEnabledFlag :: Bool #

Global switch to enable debug tracing in ghc-exactprint Delta / Print

debug :: c -> String -> c #

Provide a version of trace that comes at the end of the line, so it can easily be commented out when debugging different things.

debugM :: Monad m => String -> m () #

warn :: c -> String -> c #

isGoodDelta :: DeltaPos -> Bool #

A good delta has no negative values.

ss2delta :: Pos -> RealSrcSpan -> DeltaPos #

Create a delta from the current position to the start of the given RealSrcSpan.

ss2deltaEnd :: RealSrcSpan -> RealSrcSpan -> DeltaPos #

create a delta from the end of a current span. The +1 is because the stored position ends up one past the span, this is prior to that adjustment

ss2deltaStart :: RealSrcSpan -> RealSrcSpan -> DeltaPos #

create a delta from the start of a current span. The +1 is because the stored position ends up one past the span, this is prior to that adjustment

pos2delta :: Pos -> Pos -> DeltaPos #

Convert the start of the second Pos to be an offset from the first. The assumption is the reference starts before the second Pos

undelta :: Pos -> DeltaPos -> LayoutStartCol -> Pos #

Apply the delta to the current position, taking into account the current column offset if advancing to a new line

undeltaSpan :: RealSrcSpan -> AnnKeywordId -> DeltaPos -> AddEpAnn #

adjustDeltaForOffset :: LayoutStartCol -> DeltaPos -> DeltaPos #

ss2pos :: RealSrcSpan -> Pos #

ss2posEnd :: RealSrcSpan -> Pos #

ss2range :: SrcSpan -> (Pos, Pos) #

rs2range :: RealSrcSpan -> (Pos, Pos) #

rs :: SrcSpan -> RealSrcSpan #

range2rs :: (Pos, Pos) -> RealSrcSpan #

badRealSrcSpan :: RealSrcSpan #

spanLength :: RealSrcSpan -> Int #

isPointSrcSpan :: RealSrcSpan -> Bool #

Checks whether a SrcSpan has zero length.

orderByKey :: [(RealSrcSpan, a)] -> [RealSrcSpan] -> [(RealSrcSpan, a)] #

Given a list of items and a list of keys, returns a list of items ordered by their position in the list of keys.

isListComp :: HsDoFlavour -> Bool #

needsWhere :: DataDefnCons (LConDecl (GhcPass p)) -> Bool #

insertCppComments :: ParsedSource -> [LEpaComment] -> ParsedSource #

ghcCommentText :: LEpaComment -> String #

tokComment :: LEpaComment -> [Comment] #

hsDocStringComments :: Anchor -> RealSrcSpan -> HsDocString -> [Comment] #

dedentDocChunk :: LHsDocStringChunk -> LHsDocStringChunk #

dedentDocChunkBy :: Int -> LHsDocStringChunk -> LHsDocStringChunk #

printDecorator :: HsDocStringDecorator -> String #

mkEpaComments :: [Comment] -> [Comment] -> EpAnnComments #

comment2LEpaComment :: Comment -> LEpaComment #

mkLEpaComment :: String -> Anchor -> RealSrcSpan -> LEpaComment #

mkComment :: String -> Anchor -> RealSrcSpan -> Comment #

normaliseCommentText :: String -> String #

cmpComments :: Comment -> Comment -> Ordering #

Must compare without span filenames, for CPP injected comments with fake filename

sortComments :: [Comment] -> [Comment] #

Sort, comparing without span filenames, for CPP injected comments with fake filename

sortEpaComments :: [LEpaComment] -> [LEpaComment] #

Sort, comparing without span filenames, for CPP injected comments with fake filename

mkKWComment :: AnnKeywordId -> EpaLocation -> Comment #

Makes a comment which originates from a specific keyword.

isKWComment :: Comment -> Bool #

Detects a comment which originates from a specific keyword.

sortAnchorLocated :: [GenLocated Anchor a] -> [GenLocated Anchor a] #

dpFromString :: String -> DeltaPos #

Calculates the distance from the start of a string to the end of a string.

isSymbolRdrName :: RdrName -> Bool #

rdrName2String :: RdrName -> String #

name2String :: Name -> String #

locatedAnAnchor :: LocatedAn a t -> RealSrcSpan #

setAnchorAn :: Default an => LocatedAn an a -> Anchor -> EpAnnComments -> LocatedAn an a #

setAnchorEpa :: Default an => EpAnn an -> Anchor -> EpAnnComments -> EpAnn an #

setAnchorEpaL :: EpAnn AnnList -> Anchor -> EpAnnComments -> EpAnn AnnList #

setAnchorHsModule :: HsModule GhcPs -> Anchor -> EpAnnComments -> HsModule GhcPs #

moveAnchor :: Monoid b => SrcAnn a -> SrcAnn b #

Version of l2l that preserves the anchor, immportant if it has an updated AnchorOperation

trailingAnnLoc :: TrailingAnn -> EpaLocation #

setTrailingAnnLoc :: TrailingAnn -> EpaLocation -> TrailingAnn #

addEpAnnLoc :: AddEpAnn -> EpaLocation #

anchorToEpaLocation :: Anchor -> EpaLocation #

hackSrcSpanToAnchor :: SrcSpan -> Anchor #

hackAnchorToSrcSpan :: Anchor -> SrcSpan #