Safe Haskell | None |
---|---|
Language | Haskell98 |
Documentation
safeFromJust :: String -> Maybe t -> t #
safeFromLeft :: String -> Either a b -> a #
mapFourth4 :: (t -> t4) -> (t1, t2, t3, t) -> (t1, t2, t3, t4) #
mapSndM :: Applicative m => (b -> m c) -> (a, b) -> m (a, c) #
isIncludeFile :: FilePath -> FilePath -> Bool #
getIncludeDir :: IO FilePath #
getCssPath :: IO FilePath #
safeZipWithError :: String -> [t] -> [t1] -> [(t, t1)] #
safeZip3WithError :: String -> [t] -> [t1] -> [t2] -> [(t, t1, t2)] #
zipWithDefM :: Monad m => (a -> a -> m a) -> [a] -> [a] -> m [a] #
zipWithDef :: (a -> a -> a) -> [a] -> [a] -> [a] #
firstMaybes :: [Maybe a] -> Maybe a #
fromFirstMaybes :: a -> [Maybe a] -> a #
hashMapMapWithKey :: (k -> v1 -> v2) -> HashMap k v1 -> HashMap k v2 #
hashMapMapKeys :: (Eq k2, Hashable k2) => (k1 -> k2) -> HashMap k1 v -> HashMap k2 v #
concatMapM :: (Monad m, Traversable t) => (a -> m [b]) -> t a -> m [b] #
replaceSubset :: (Eq k, Hashable k) => [(k, a)] -> [(k, a)] -> [(k, a)] #
replaceWith :: (Eq a, Hashable a) => (b -> a) -> [b] -> [b] -> [b] #
firstElems :: [(ByteString, ByteString)] -> ByteString -> Maybe (Int, ByteString, (ByteString, ByteString)) #
splitters :: [(ByteString, t)] -> ByteString -> [(Int, t, (ByteString, ByteString))] #
bchopAlts :: [(ByteString, ByteString)] -> ByteString -> [ByteString] #
angleBrackets :: Doc -> Doc #
intToString :: Int -> String #
mapAccumM :: (Monad m, Traversable t) => (a -> b -> m (a, c)) -> a -> t b -> m (a, t c) #
nubHashLast :: (Eq k, Hashable k) => (a -> k) -> [a] -> [a] #
nubHashLastM :: (Eq k, Hashable k, Monad m) => (a -> m k) -> [a] -> m [a] #
uniqueByKey :: (Eq k, Hashable k) => [(k, v)] -> Either (k, [v]) [v] #
uniqueByKey' :: (Eq k, Hashable k) => ((k, [v]) -> Either e v) -> [(k, v)] -> Either e [v] #
firstGroup :: (Eq k, Ord k, Hashable k) => [(k, a)] -> [a] #
concatUnzip :: [([a], [b])] -> ([a], [b]) #
sayReadFile :: FilePath -> IO String #