Safe Haskell | None |
---|---|
Language | Haskell2010 |
- parDoc :: String -> Doc
- parDocW :: [String] -> Doc
- fromMaybeIdentity :: Identity a -> Maybe a -> Identity a
- fromOptionIdentity :: Identity a -> Option a -> Identity a
- traceIfDumpConf :: (MonadMultiReader Config m, Show a) => String -> (DebugConfig -> Identity (Last Bool)) -> a -> m ()
- mModify :: MonadMultiState s m => (s -> s) -> m ()
- customLayouterF :: Anns -> LayouterF
- astToDoc :: Data ast => ast -> Doc
- briDocToDoc :: BriDoc -> Doc
- annsDoc :: Anns -> Doc
- newtype Max a = Max {
- getMax :: a
- tellDebugMess :: MonadMultiWriter (Seq String) m => String -> m ()
- tellDebugMessShow :: forall a m. (MonadMultiWriter (Seq String) m, Show a) => a -> m ()
- briDocToDocWithAnns :: BriDoc -> Doc
- breakEither :: (a -> Either b c) -> [a] -> ([b], [c])
- spanMaybe :: (a -> Maybe b) -> [a] -> ([b], [a])
- transformUp :: Uniplate on => (on -> on) -> on -> on
- transformDownMay :: Uniplate on => (on -> Maybe on) -> on -> on
- data FirstLastView a
- = FirstLastEmpty
- | FirstLastSingleton a
- | FirstLast a [a] a
- splitFirstLast :: [a] -> FirstLastView a
- lines' :: String -> [String]
Documentation
traceIfDumpConf :: (MonadMultiReader Config m, Show a) => String -> (DebugConfig -> Identity (Last Bool)) -> a -> m () Source #
mModify :: MonadMultiState s m => (s -> s) -> m () Source #
customLayouterF :: Anns -> LayouterF Source #
briDocToDoc :: BriDoc -> Doc Source #
tellDebugMess :: MonadMultiWriter (Seq String) m => String -> m () Source #
tellDebugMessShow :: forall a m. (MonadMultiWriter (Seq String) m, Show a) => a -> m () Source #
briDocToDocWithAnns :: BriDoc -> Doc Source #
breakEither :: (a -> Either b c) -> [a] -> ([b], [c]) Source #
transformUp :: Uniplate on => (on -> on) -> on -> on Source #
transformDownMay :: Uniplate on => (on -> Maybe on) -> on -> on Source #
data FirstLastView a Source #
FirstLastEmpty | |
FirstLastSingleton a | |
FirstLast a [a] a |
splitFirstLast :: [a] -> FirstLastView a Source #