Safe Haskell | None |
---|---|
Language | Haskell2010 |
Synopsis
- type Pos = (Int, Int)
- data Comment = Comment {}
- newtype LayoutStartCol = LayoutStartCol {}
- showGhc :: Outputable a => a -> String
Documentation
A Haskell comment. The AnnKeywordId
is present if it has been converted
from an AnnKeywordId
because the annotation must be interleaved into the
stream and does not have a well-defined position
Comment | |
|
Instances
Outputable Comment Source # | |
Defined in Language.Haskell.GHC.ExactPrint.Types | |
Data Comment Source # | |
Defined in Language.Haskell.GHC.ExactPrint.Types gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Comment -> c Comment # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Comment # toConstr :: Comment -> Constr # dataTypeOf :: Comment -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Comment) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Comment) # gmapT :: (forall b. Data b => b -> b) -> Comment -> Comment # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Comment -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Comment -> r # gmapQ :: (forall d. Data d => d -> u) -> Comment -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Comment -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Comment -> m Comment # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Comment -> m Comment # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Comment -> m Comment # | |
Show Comment Source # | |
Eq Comment Source # | |
Ord Comment Source # | |
Defined in Language.Haskell.GHC.ExactPrint.Types |
newtype LayoutStartCol Source #
Marks the start column of a layout block.
Instances
Num LayoutStartCol Source # | |
Defined in Language.Haskell.GHC.ExactPrint.Types (+) :: LayoutStartCol -> LayoutStartCol -> LayoutStartCol # (-) :: LayoutStartCol -> LayoutStartCol -> LayoutStartCol # (*) :: LayoutStartCol -> LayoutStartCol -> LayoutStartCol # negate :: LayoutStartCol -> LayoutStartCol # abs :: LayoutStartCol -> LayoutStartCol # signum :: LayoutStartCol -> LayoutStartCol # fromInteger :: Integer -> LayoutStartCol # | |
Show LayoutStartCol Source # | |
Defined in Language.Haskell.GHC.ExactPrint.Types showsPrec :: Int -> LayoutStartCol -> ShowS # show :: LayoutStartCol -> String # showList :: [LayoutStartCol] -> ShowS # | |
Eq LayoutStartCol Source # | |
Defined in Language.Haskell.GHC.ExactPrint.Types (==) :: LayoutStartCol -> LayoutStartCol -> Bool # (/=) :: LayoutStartCol -> LayoutStartCol -> Bool # |
showGhc :: Outputable a => a -> String Source #