Skip to content

REPL

Repl.hs
{-# LANGUAGE BlockArguments #-} 

module Repl where

import Chess
import Control.Monad
import Control.Monad.Except
import Control.Monad.State
import Data.Text (Text)
import Data.Text qualified as T
import Evaluator
import Parser
import Text.Megaparsec hiding (parse) 
import Witch (into)


main :: IO ()
main = do
    runReplWithBoard $
      displayLine "Welcome!\n\n" >> forever do 

        line <- requestLine "> " 
        let instruction = parse line 
        board <- get 
        result <-
          case instruction of
            Left (ParseError err) -> pure err 
            Left (ReplError err) -> pure err
            Right instr -> evaluate instr
              `catchError` ( \case 
                              ReplError txt -> pure txt
                              err -> throwError err 
                          )

        displayLine result 
    pure ()

  where

    runReplWithBoard :: StateT Board (ExceptT e IO) a -> IO (Either e a) 
    runReplWithBoard = runExceptT . flip evalStateT initBoard 

    displayLine :: Text -> StateT Board (ExceptT ChessError IO) ()
    displayLine = liftIO . putStrLn . into @String 

    requestLine :: Text -> StateT Board (ExceptT ChessError IO) Text
    requestLine prompt = do
      displayLine prompt
      line <- liftIO getLine
      pure $ into @Text line

Analysis

This module is responsible for producing the actual runnable program (of type IO ()) that wraps up the whole system.

main

```haskell

main :: IO () main = void $ runReplWithBoard $ displayLine "Welcome!\n\n" >> forever do

            line <- requestLine "> "
            let instruction = parse line
            board <- get
            result <-
            case instruction of
                Left (ParseError err) -> pure err
                Left (ReplError err) -> pure err
                Right instr -> evaluate instr
                `catchError` ( \case
                                ReplError txt -> pure txt
                                err -> throwError err 
                            )

            displayLine result 
```

```haskell

main :: IO () main = runReplWithBoard $ displayLine "Welcome!\n\n" >> loop where

        loop = do

        line <- requestLine "> "
        let instruction = parse line
        board <- get
        result <-
            case instruction of
            Left (ParseError err) -> pure err
            Left (ReplError err) -> pure err
            Right instr -> evaluate instr
                `catchError` ( \case
                                ReplError txt -> pure txt
                                err -> throwError err 
                            )

        displayLine result 
        loop
```

```haskell

main :: IO () main = do runReplWithBoard $ displayLine "Welcome!\n\n" >> forever do

            line <- requestLine "> "
            let instruction = parse line
            board <- get
            result <-
            case instruction of
                Left (ParseError err) -> pure err
                Left (ReplError err) -> pure err
                Right instr -> evaluate instr
                `catchError` ( \case
                                ReplError txt -> pure txt
                                err -> throwError err 
                            )

            displayLine result 
    pure ()
```

Last update: February 9, 2023
Created: January 8, 2023