Safe Haskell | None |
---|---|
Language | Haskell98 |
- lineCol :: SrcLoc -> (Int, Int)
- spanLineCol :: SrcSpan -> ((Int, Int), (Int, Int))
- type Filename = String
- type Directory = String
- type SourceText = ByteString
- type FileOrDir = String
- getDir :: String -> String
- checkDir :: [Char] -> IO ()
- isDirectory :: FileOrDir -> IO Bool
- fanout :: (a -> b) -> (a -> c) -> a -> (b, c)
- (<>) :: (a -> b) -> (a -> c) -> a -> (b, c)
- (><) :: (a -> c) -> (b -> d) -> (a, b) -> (c, d)
- lookups :: Eq a => a -> [(a, b)] -> [b]
- lookups' :: Eq a => a -> [((a, b), c)] -> [(b, c)]
- pairs :: [a] -> [(a, a)]
- mfmap :: Functor f => (a -> b) -> [f a] -> [f b]
- each :: [a] -> (a -> b) -> [b]
- cmpEq :: Ordering -> Bool
- cmpFst :: (a -> a -> Ordering) -> (a, b) -> (a, b) -> Ordering
- cmpSnd :: (b -> b -> Ordering) -> (a, b) -> (a, b) -> Ordering
- type (:?) a b = a
- foldPair :: (a -> a -> Maybe a) -> [a] -> [a]
- class PartialMonoid x where
- normalise :: (Ord t, PartialMonoid t) => [t] -> [t]
- normaliseNoSort :: (Ord t, PartialMonoid t) => [t] -> [t]
- normaliseBy :: Ord t => (t -> t -> Maybe t) -> [t] -> [t]
Documentation
type SourceText = ByteString Source #
checkDir :: [Char] -> IO () Source #
Creates a directory (from a filename string) if it doesn't exist
class PartialMonoid x where Source #
normalise :: (Ord t, PartialMonoid t) => [t] -> [t] Source #
normaliseNoSort :: (Ord t, PartialMonoid t) => [t] -> [t] Source #
normaliseBy :: Ord t => (t -> t -> Maybe t) -> [t] -> [t] Source #