{-# LANGUAGE KindSignatures, GADTs, InstanceSigs, FlexibleContexts, ScopedTypeVariables #-} module HERMIT.Shell.Interpreter ( -- * The HERMIT Interpreter Interp , interp , interpExprH -- , runExprH ) where import Control.Monad.Error import Control.Monad.State import Data.Char import Data.Dynamic import qualified Data.Map as M import HERMIT.External import HERMIT.Parser import HERMIT.Kure import HERMIT.Shell.Dictionary import HERMIT.Shell.Types -- | An 'Interp' @cmd@ is a /possible/ means of converting a 'Typeable' value to a value of type @cmd@. data Interp :: * -> * where Interp :: Typeable a => (a -> cmd) -> Interp cmd -- | The primitive way of building an 'Interp'. interp :: Typeable a => (a -> cmd) -> Interp cmd interp = Interp instance Functor Interp where fmap :: (a -> b) -> Interp a -> Interp b fmap f (Interp g) = Interp (f . g) {- runExprH :: forall m r. (MonadCatch m, MonadError CLException m, MonadIO m, MonadState CommandLineState m) => ExprH -> m r runExprH e = do dyns <- interpExpr e CmdInterps interps <- gets cl_interps case [ performCommand $ f a | Interp f <- interps, Just a <- map fromDynamic dyns] of [] -> fail $ "Does not type-check: " ++ unparseExprH e ++ "\n" b:_ -> b :: m r -} -- | Interpret an 'ExprH' by looking up the appropriate 'Dynamic'(s) in the provided 'Dictionary', -- then interpreting the 'Dynamic'(s) with the provided 'Interp's, returning the first -- interpretation to succeed (or an error string if none succeed). interpExprH :: MonadState CommandLineState m => [Interp b] -> ExprH -> m b interpExprH interps e = interpExpr e >>= runInterp e interps runInterp :: Monad m => ExprH -> [Interp b] -> [Dynamic] -> m b runInterp e interps dyns = case [f a | Interp f <- interps, Just a <- map fromDynamic dyns] of [] -> fail $ "Does not type-check: " ++ unparseExprH e ++ "\n" b:_ -> return b interpExpr :: MonadState CommandLineState m => ExprH -> m [Dynamic] interpExpr = interpExpr' False -- input: list length n, each elem is a variable length list of possible interpretations -- output: variable length list, each elem is list of length n fromDynList :: [[Dynamic]] -> [[Dynamic]] fromDynList [] = [[]] fromDynList (hs:dynss) = [ h:t | h <- hs, t <- fromDynList dynss ] toBoxedList :: (Extern a, Typeable b) => [[Dynamic]] -> ([a] -> b) -> [Dynamic] toBoxedList dyns boxCon = [ toDyn $ boxCon (map unbox l) | dl <- dyns, Just l <- [mapM fromDynamic dl] ] interpExpr' :: MonadState CommandLineState m => Bool -> ExprH -> m [Dynamic] interpExpr' _ (SrcName str) = return [ toDyn $ StringBox str ] interpExpr' _ (CoreH str) = return [ toDyn $ CoreBox (CoreString str) ] interpExpr' _ (ListH exprs) = do dyns <- liftM fromDynList $ mapM (interpExpr' True) exprs return $ toBoxedList dyns StringListBox ++ toBoxedList dyns (PathBox . pathToSnocPath) -- ugly hack. The whole dynamic stuff could do with overhauling. ++ toBoxedList dyns (TransformCorePathBox . return . pathToSnocPath) ++ toBoxedList dyns IntListBox ++ toBoxedList dyns RewriteCoreListBox interpExpr' rhs (CmdName str) | all isDigit str = do let i = read str return [ -- An Int is either a Path, or will be interpreted specially later. toDyn $ IntBox i -- TODO: Find a better long-term solution. , toDyn $ TransformCorePathBox (deprecatedIntToPathT i) ] | otherwise = do dict <- gets (mkDict . cl_externals) case M.lookup str dict of Just dyns -> do dyns' <- mapM provideState dyns return $ if rhs then toDyn (StringBox str) : dyns' else dyns' -- not a command, try as a string arg... worst case: dynApply fails with "bad type of expression" -- best case: 'help ls' works instead of 'help "ls"'. this is likewise done in the clause above Nothing | rhs -> return [toDyn $ StringBox str] | otherwise -> fail $ "User error, unrecognised HERMIT command: " ++ show str interpExpr' _ (AppH e1 e2) = liftM2 dynCrossApply (interpExpr' False e1) (interpExpr' True e2) -- We essentially treat externals of the type 'CommandLineState -> b' specially, -- providing them the shell state here, so they don't need a monadic return type -- in order to access it themselves. provideState :: MonadState CommandLineState m => Dynamic -> m Dynamic provideState dyn = do st <- get case dynApply dyn (toDyn $ box st) of Just d -> return d Nothing -> return dyn -- Cross product of possible applications. dynCrossApply :: [Dynamic] -> [Dynamic] -> [Dynamic] dynCrossApply fs xs = [ r | f <- fs, x <- xs, Just r <- return (dynApply f x)] -------------------------------------------