{-# LANGUAGE PatternSynonyms #-}
module Development.IDE.Graph(
shakeOptions,
Rules,
Action, action,
pattern Key,
newKey, renderKey,
actionFinally, actionBracket, actionCatch, actionFork,
ShakeOptions(shakeAllowRedefineRules, shakeExtra),
getShakeExtra, getShakeExtraRules, newShakeExtra,
parallel,
ShakeValue, RuleResult,
alwaysRerun,
getDirtySet,
getKeysAndVisitedAge,
module Development.IDE.Graph.KeyMap,
module Development.IDE.Graph.KeySet,
) where
import Development.IDE.Graph.Database
import Development.IDE.Graph.Internal.Action
import Development.IDE.Graph.Internal.Key
import Development.IDE.Graph.Internal.Options
import Development.IDE.Graph.Internal.Rules
import Development.IDE.Graph.Internal.Types
import Development.IDE.Graph.KeyMap
import Development.IDE.Graph.KeySet