ContentsIndex
Haskore.General.Utility
Synopsis
assert :: Bool -> String -> IO ()
unlinesS :: [ShowS] -> ShowS
concatS :: [ShowS] -> ShowS
rightS :: Int -> ShowS -> ShowS
leftS :: Int -> ShowS -> ShowS
centreS :: Int -> ShowS -> ShowS
right :: Int -> String -> String
left :: Int -> String -> String
centre :: Int -> String -> String
spaces :: Int -> String
andOnError :: IO a -> IO b -> IO b
butOnError :: IO a -> IO () -> IO a
zeroOrMore :: MonadPlus m => m a -> m [a]
oneOrMore :: MonadPlus m => m a -> m [a]
fst3 :: (a, b, c) -> a
snd3 :: (a, b, c) -> b
thd3 :: (a, b, c) -> c
merge :: (a -> a -> Bool) -> [a] -> [a] -> [a]
partition :: (a -> Bool) -> [a] -> ([a], [a])
shuffle :: RandomGen g => [a] -> g -> ([a], g)
removeDups :: Eq a => [a] -> [a]
roundDiff :: RealFrac t => t -> State t Int
roundDiff' :: RealFrac t => t -> t -> (Int, t)
flattenTuples2 :: [(a, a)] -> [a]
flattenTuples3 :: [(a, a, a)] -> [a]
flattenTuples4 :: [(a, a, a, a)] -> [a]
pairMap :: (a -> c, b -> d) -> (a, b) -> (c, d)
zapWith :: (a -> a -> b) -> [a] -> [b]
translate :: Ord a => [a] -> [a] -> [a] -> [a]
randList :: Int -> [Int]
select :: a -> [(Bool, a)] -> a
divisible :: Integral a => Ratio a -> Ratio a -> Bool
divide :: Integral a => Ratio a -> Ratio a -> a
gcdDur :: Integral a => Ratio a -> Ratio a -> Ratio a
stateToReadS :: State String a -> ReadS a
Produced by Haddock version 0.6