Safe Haskell | None |
---|---|
Language | Haskell98 |
Documentation
wrapStarsWithOptStars :: Bool -> [Char] -> [Char] Source
colorStrLn :: Moods -> String -> IO () Source
startPhase :: Moods -> [Char] -> IO () Source
unIntersperse :: Eq t => t -> [t] -> [[t]] Source
assertstar :: [Char] -> Bool -> c -> c Source
findWithDefaultL :: (a -> Bool) -> [a] -> a -> a Source
tr_reverse :: [a] -> [a] Source
safeZipWith :: [Char] -> (a -> b -> c) -> [a] -> [b] -> [c] Source
safeUnion :: (Hashable k, Show k, Eq k) => [Char] -> HashMap k v -> HashMap k v -> HashMap k v Source
chopPrefix :: Eq a => [a] -> [a] -> Maybe [a] Source
firstElems :: [(ByteString, ByteString)] -> ByteString -> Maybe (Int, ByteString, (ByteString, ByteString)) Source
splitters :: [(ByteString, t)] -> ByteString -> [(Int, t, (ByteString, ByteString))] Source
bchopAlts :: [(ByteString, ByteString)] -> ByteString -> [ByteString] Source
stripParens :: Text -> Text Source
checkExitCode :: Monad m => [Char] -> ExitCode -> m () Source
hashMapToAscList :: Ord a => HashMap a b -> [(a, b)] Source
hashMapMapWithKey :: (k -> v1 -> v2) -> HashMap k v1 -> HashMap k v2 Source
applyNonNull :: t -> ([t1] -> t) -> [t1] -> t Source
concatMapM :: (Functor f, Monad f) => (a1 -> f [a]) -> [a1] -> f [a] Source
angleBrackets :: Doc -> Doc Source
intersperse :: Doc -> [Doc] -> Doc Source
(<$$>) :: (Traversable t, Applicative f) => (a -> f b) -> t a -> f (t b) Source