2024-12-20 11:38:09 -06:00
|
|
|
module REPL where
|
|
|
|
|
|
|
|
import Eval
|
2025-01-01 18:05:21 -06:00
|
|
|
import FileEval
|
2024-12-20 11:38:09 -06:00
|
|
|
import Lexer
|
|
|
|
import Parser
|
|
|
|
import Research
|
|
|
|
|
2025-01-30 14:19:30 -06:00
|
|
|
import Control.Exception (SomeException, catch)
|
|
|
|
import Control.Monad.IO.Class (liftIO)
|
|
|
|
import Control.Monad.Catch (handle, MonadCatch)
|
|
|
|
import Data.Char (isSpace)
|
|
|
|
import Data.List ( dropWhile
|
|
|
|
, dropWhileEnd
|
|
|
|
, intercalate
|
|
|
|
, isPrefixOf)
|
2024-12-27 20:46:30 -06:00
|
|
|
import System.Console.Haskeline
|
2024-12-29 20:29:41 -06:00
|
|
|
|
|
|
|
import qualified Data.Map as Map
|
2024-12-20 11:38:09 -06:00
|
|
|
|
2024-12-29 21:49:57 -06:00
|
|
|
repl :: Env -> IO ()
|
2025-01-30 14:19:30 -06:00
|
|
|
repl env = runInputT defaultSettings (withInterrupt (loop env True))
|
2024-12-27 20:46:30 -06:00
|
|
|
where
|
2025-01-30 14:19:30 -06:00
|
|
|
loop :: Env -> Bool -> InputT IO ()
|
|
|
|
loop env decode = handle (interruptHandler env decode) $ do
|
2024-12-29 08:29:25 -06:00
|
|
|
minput <- getInputLine "tricu < "
|
2025-01-27 16:46:41 -06:00
|
|
|
case minput of
|
|
|
|
Nothing -> outputStrLn "Exiting tricu"
|
|
|
|
Just s
|
2025-01-30 14:19:30 -06:00
|
|
|
| strip s == "" -> loop env decode
|
2025-01-27 16:46:41 -06:00
|
|
|
| strip s == "!exit" -> outputStrLn "Exiting tricu"
|
2025-01-30 14:19:30 -06:00
|
|
|
| strip s == "!decode" -> do
|
|
|
|
outputStrLn $ "Decoding " ++ (if decode then "disabled" else "enabled")
|
|
|
|
loop env (not decode)
|
|
|
|
| "!import" `isPrefixOf` strip s -> do
|
|
|
|
let afterImport = dropWhile (== ' ') $ drop (length ("!import" :: String)) (strip s)
|
|
|
|
if not (null afterImport)
|
|
|
|
then outputStrLn "Warning: REPL imports are interactive; \
|
|
|
|
\additional arguments are ignored."
|
|
|
|
else pure ()
|
2025-01-27 16:46:41 -06:00
|
|
|
path <- getInputLine "File path to load < "
|
|
|
|
case path of
|
|
|
|
Nothing -> do
|
|
|
|
outputStrLn "No input received; stopping import."
|
2025-01-30 14:19:30 -06:00
|
|
|
loop env decode
|
2025-01-27 16:46:41 -06:00
|
|
|
Just p -> do
|
2025-01-30 14:19:30 -06:00
|
|
|
loadedEnv <- liftIO $ evaluateFileWithContext env
|
2025-01-27 16:46:41 -06:00
|
|
|
(strip p) `catch` \e -> errorHandler env e
|
2025-01-30 14:19:30 -06:00
|
|
|
loop (Map.delete "!result" (Map.union loadedEnv env)) decode
|
|
|
|
| take 2 s == "--" -> loop env decode
|
2025-01-27 16:46:41 -06:00
|
|
|
| otherwise -> do
|
2025-01-30 14:19:30 -06:00
|
|
|
newEnv <- liftIO $ processInput env s decode `catch` errorHandler env
|
|
|
|
loop newEnv decode
|
2025-01-19 14:41:25 -06:00
|
|
|
|
2025-01-30 14:19:30 -06:00
|
|
|
interruptHandler :: Env -> Bool -> Interrupt -> InputT IO ()
|
|
|
|
interruptHandler env decode _ = do
|
2025-01-27 16:46:41 -06:00
|
|
|
outputStrLn "Interrupted with CTRL+C\n\
|
|
|
|
\You can use the !exit command or CTRL+D to exit"
|
2025-01-30 14:19:30 -06:00
|
|
|
loop env decode
|
2025-01-27 16:46:41 -06:00
|
|
|
|
2025-01-30 14:19:30 -06:00
|
|
|
processInput :: Env -> String -> Bool -> IO Env
|
|
|
|
processInput env input decode = do
|
2025-01-19 14:41:25 -06:00
|
|
|
let asts = parseTricu input
|
2024-12-30 14:19:43 -06:00
|
|
|
newEnv = evalTricu env asts
|
2025-01-30 14:19:30 -06:00
|
|
|
case Map.lookup "!result" newEnv of
|
|
|
|
Just r -> do
|
|
|
|
putStrLn $ "tricu > " ++
|
|
|
|
if decode
|
|
|
|
then decodeResult r
|
|
|
|
else show r
|
|
|
|
Nothing -> pure ()
|
2024-12-29 20:29:41 -06:00
|
|
|
return newEnv
|
2024-12-30 14:19:43 -06:00
|
|
|
|
2024-12-29 21:49:57 -06:00
|
|
|
errorHandler :: Env -> SomeException -> IO (Env)
|
2024-12-29 20:29:41 -06:00
|
|
|
errorHandler env e = do
|
|
|
|
putStrLn $ "Error: " ++ show e
|
|
|
|
return env
|
2025-01-02 19:08:14 -06:00
|
|
|
|
|
|
|
strip :: String -> String
|
|
|
|
strip = dropWhileEnd isSpace . dropWhile isSpace
|