Safe Haskell | None |
---|---|
Language | Haskell98 |
- type Rule = (Targets, Sources, Commands)
- hake :: [Rule] -> IO ()
- hakeT :: [Rule] -> FilePath -> IO ()
- hakefileIs :: FilePath -> [FilePath] -> IO ExitCode
- base :: Targets -> Sources -> (String -> [String] -> MadeFromList -> Bool -> IO ExitCode) -> Rule
- dflt :: [String] -> Rule
- deps :: [String] -> [String] -> Rule
- mkfl :: String -> [String] -> Rule
- addDeps :: [Rule] -> [(FilePath, [FilePath])] -> [Rule]
- delRules :: [Rule] -> [(FilePath, [FilePath])] -> [Rule]
- setCmd :: Rule -> (String -> [String] -> MadeFromList -> IO ExitCode) -> Rule
- systemE :: MonadIO m => String -> m ExitCode
- rawSystemE :: MonadIO m => [String] -> m ExitCode
- isSuffixOf :: Eq a => [a] -> [a] -> Bool
- changeSuffix :: String -> String -> String -> String
- getVals :: String -> [String] -> [String]
- getNewers :: FilePath -> [FilePath] -> IO [FilePath]
- data ExitCode :: *
- const2 :: a -> b -> c -> a
Documentation
hake :: [Rule] -> IO () Source
The hake
function take rules as argument and get target from command line
and make target.
base :: Targets -> Sources -> (String -> [String] -> MadeFromList -> Bool -> IO ExitCode) -> Rule Source
rawSystemE :: MonadIO m => [String] -> m ExitCode Source
isSuffixOf :: Eq a => [a] -> [a] -> Bool
The isSuffixOf
function takes two lists and returns True
iff the first list is a suffix of the second.
Both lists must be finite.
data ExitCode :: *
Defines the exit codes that a program can return.
ExitSuccess | indicates successful termination; |
ExitFailure Int | indicates program failure with an exit code. The exact interpretation of the code is operating-system dependent. In particular, some values may be prohibited (e.g. 0 on a POSIX-compliant system). |
const2 :: a -> b -> c -> a