2024-10-02 22:56:15 +02:00
|
|
|
module Language.Elna.Backend.Allocator
|
2024-10-01 00:02:19 +02:00
|
|
|
( MachineConfiguration(..)
|
|
|
|
, Store(..)
|
|
|
|
, allocate
|
2024-09-27 00:22:44 +02:00
|
|
|
) where
|
2024-10-01 00:02:19 +02:00
|
|
|
|
|
|
|
import Data.HashMap.Strict (HashMap)
|
2024-11-24 13:05:11 +01:00
|
|
|
import Data.Int (Int32)
|
2024-11-14 19:55:30 +01:00
|
|
|
import Data.Word (Word32)
|
2024-10-01 00:02:19 +02:00
|
|
|
import Data.Vector (Vector)
|
2024-11-14 19:55:30 +01:00
|
|
|
import Language.Elna.Backend.Intermediate
|
|
|
|
( ProcedureQuadruples(..)
|
|
|
|
, Operand(..)
|
|
|
|
, Quadruple(..)
|
|
|
|
, Variable(..)
|
|
|
|
)
|
2024-10-01 00:02:19 +02:00
|
|
|
import Language.Elna.Location (Identifier(..))
|
2024-11-16 09:23:40 +01:00
|
|
|
import Control.Monad.Trans.Reader (ReaderT, asks, runReaderT)
|
2024-11-20 17:38:03 +01:00
|
|
|
import Control.Monad.Trans.State (State, runState, modify')
|
2024-11-16 09:23:40 +01:00
|
|
|
import GHC.Records (HasField(..))
|
2024-11-24 13:05:11 +01:00
|
|
|
import Control.Monad.Trans.Class (MonadTrans(..))
|
|
|
|
import Control.Monad.Trans.Except (ExceptT(..), runExceptT, throwE)
|
|
|
|
import Data.List ((!?))
|
2024-10-01 00:02:19 +02:00
|
|
|
|
2024-11-14 19:55:30 +01:00
|
|
|
data Store r
|
|
|
|
= RegisterStore r
|
2024-11-24 13:05:11 +01:00
|
|
|
| StackStore Int32 r
|
|
|
|
|
|
|
|
data AllocationError = AllocationError
|
|
|
|
deriving Eq
|
|
|
|
|
|
|
|
instance Show AllocationError
|
|
|
|
where
|
|
|
|
show = const "Ran out of registers during register allocation"
|
2024-10-01 00:02:19 +02:00
|
|
|
|
|
|
|
newtype MachineConfiguration r = MachineConfiguration
|
2024-10-06 18:07:57 +02:00
|
|
|
{ temporaryRegisters :: [r]
|
2024-10-01 00:02:19 +02:00
|
|
|
}
|
|
|
|
|
2024-11-20 17:38:03 +01:00
|
|
|
newtype MachineState = MachineState
|
|
|
|
{ stackSize :: Word32
|
|
|
|
} deriving (Eq, Show)
|
|
|
|
|
2024-11-16 09:23:40 +01:00
|
|
|
newtype Allocator r a = Allocator
|
2024-11-24 13:05:11 +01:00
|
|
|
{ runAllocator :: ExceptT AllocationError (ReaderT (MachineConfiguration r) (State MachineState)) a
|
2024-11-16 09:23:40 +01:00
|
|
|
}
|
|
|
|
|
|
|
|
instance forall r. Functor (Allocator r)
|
|
|
|
where
|
|
|
|
fmap f = Allocator . fmap f . runAllocator
|
|
|
|
|
|
|
|
instance forall r. Applicative (Allocator r)
|
|
|
|
where
|
|
|
|
pure = Allocator . pure
|
|
|
|
(Allocator x) <*> (Allocator y) = Allocator $ x <*> y
|
|
|
|
|
|
|
|
instance forall r. Monad (Allocator r)
|
|
|
|
where
|
|
|
|
(Allocator allocator) >>= f = Allocator $ allocator >>= (runAllocator . f)
|
|
|
|
|
2024-10-01 00:02:19 +02:00
|
|
|
allocate
|
|
|
|
:: forall r
|
|
|
|
. MachineConfiguration r
|
|
|
|
-> HashMap Identifier (Vector (Quadruple Variable))
|
2024-11-24 13:05:11 +01:00
|
|
|
-> Either AllocationError (HashMap Identifier (ProcedureQuadruples (Store r)))
|
|
|
|
allocate machineConfiguration = traverse function
|
2024-10-01 00:02:19 +02:00
|
|
|
where
|
2024-11-24 13:05:11 +01:00
|
|
|
run = flip runState (MachineState{ stackSize = 0 })
|
|
|
|
. flip runReaderT machineConfiguration
|
|
|
|
. runExceptT
|
|
|
|
. runAllocator
|
|
|
|
. mapM quadruple
|
|
|
|
function :: Vector (Quadruple Variable) -> Either AllocationError (ProcedureQuadruples (Store r))
|
2024-11-20 17:38:03 +01:00
|
|
|
function quadruples' =
|
2024-11-24 13:05:11 +01:00
|
|
|
let (result, lastState) = run quadruples'
|
|
|
|
in makeResult lastState <$> result
|
|
|
|
makeResult MachineState{ stackSize } result = ProcedureQuadruples
|
|
|
|
{ quadruples = result
|
|
|
|
, stackSize = stackSize
|
|
|
|
}
|
2024-11-16 09:23:40 +01:00
|
|
|
|
|
|
|
quadruple :: Quadruple Variable -> Allocator r (Quadruple (Store r))
|
|
|
|
quadruple = \case
|
|
|
|
StartQuadruple -> pure StartQuadruple
|
|
|
|
StopQuadruple -> pure StopQuadruple
|
|
|
|
ParameterQuadruple operand1 -> do
|
|
|
|
operand1' <- operand operand1
|
|
|
|
pure $ ParameterQuadruple operand1'
|
|
|
|
CallQuadruple name count -> pure $ CallQuadruple name count
|
|
|
|
AddQuadruple operand1 operand2 variable -> do
|
|
|
|
operand1' <- operand operand1
|
|
|
|
operand2' <- operand operand2
|
|
|
|
AddQuadruple operand1' operand2' <$> storeVariable variable
|
|
|
|
SubtractionQuadruple operand1 operand2 variable -> do
|
|
|
|
operand1' <- operand operand1
|
|
|
|
operand2' <- operand operand2
|
|
|
|
SubtractionQuadruple operand1' operand2' <$> storeVariable variable
|
|
|
|
NegationQuadruple operand1 variable -> do
|
|
|
|
operand1' <- operand operand1
|
|
|
|
NegationQuadruple operand1' <$> storeVariable variable
|
|
|
|
ProductQuadruple operand1 operand2 variable -> do
|
|
|
|
operand1' <- operand operand1
|
|
|
|
operand2' <- operand operand2
|
|
|
|
ProductQuadruple operand1' operand2' <$> storeVariable variable
|
|
|
|
DivisionQuadruple operand1 operand2 variable -> do
|
|
|
|
operand1' <- operand operand1
|
|
|
|
operand2' <- operand operand2
|
|
|
|
DivisionQuadruple operand1' operand2' <$> storeVariable variable
|
|
|
|
LabelQuadruple label -> pure $ LabelQuadruple label
|
|
|
|
GoToQuadruple label -> pure $ GoToQuadruple label
|
|
|
|
EqualQuadruple operand1 operand2 goToLabel -> do
|
|
|
|
operand1' <- operand operand1
|
|
|
|
operand2' <- operand operand2
|
|
|
|
pure $ EqualQuadruple operand1' operand2' goToLabel
|
|
|
|
NonEqualQuadruple operand1 operand2 goToLabel -> do
|
|
|
|
operand1' <- operand operand1
|
|
|
|
operand2' <- operand operand2
|
|
|
|
pure $ NonEqualQuadruple operand1' operand2' goToLabel
|
|
|
|
LessQuadruple operand1 operand2 goToLabel -> do
|
|
|
|
operand1' <- operand operand1
|
|
|
|
operand2' <- operand operand2
|
|
|
|
pure $ LessQuadruple operand1' operand2' goToLabel
|
|
|
|
GreaterQuadruple operand1 operand2 goToLabel -> do
|
|
|
|
operand1' <- operand operand1
|
|
|
|
operand2' <- operand operand2
|
|
|
|
pure $ GreaterQuadruple operand1' operand2' goToLabel
|
|
|
|
LessOrEqualQuadruple operand1 operand2 goToLabel -> do
|
|
|
|
operand1' <- operand operand1
|
|
|
|
operand2' <- operand operand2
|
|
|
|
pure $ LessOrEqualQuadruple operand1' operand2' goToLabel
|
|
|
|
GreaterOrEqualQuadruple operand1 operand2 goToLabel -> do
|
|
|
|
operand1' <- operand operand1
|
|
|
|
operand2' <- operand operand2
|
|
|
|
pure $ GreaterOrEqualQuadruple operand1' operand2' goToLabel
|
|
|
|
AssignQuadruple operand1 variable -> do
|
|
|
|
operand1' <- operand operand1
|
|
|
|
AssignQuadruple operand1' <$> storeVariable variable
|
|
|
|
|
|
|
|
operand :: Operand Variable -> Allocator r (Operand (Store r))
|
|
|
|
operand (IntOperand x) = pure $ IntOperand x
|
|
|
|
operand (VariableOperand variableOperand) =
|
|
|
|
VariableOperand <$> storeVariable variableOperand
|
|
|
|
|
|
|
|
storeVariable :: Variable -> Allocator r (Store r)
|
|
|
|
storeVariable (TempVariable index) = do
|
2024-11-24 13:05:11 +01:00
|
|
|
temporaryRegisters' <- Allocator $ lift $ asks $ getField @"temporaryRegisters"
|
|
|
|
maybe (Allocator $ throwE AllocationError) (pure . RegisterStore)
|
|
|
|
$ temporaryRegisters' !? fromIntegral index
|
2024-11-16 09:23:40 +01:00
|
|
|
storeVariable (LocalVariable index) = do
|
2024-11-24 13:05:11 +01:00
|
|
|
temporaryRegisters' <- Allocator $ lift $ asks $ getField @"temporaryRegisters"
|
|
|
|
Allocator $ lift $ lift $ modify' $ MachineState . (+ 4) . getField @"stackSize"
|
|
|
|
maybe (Allocator $ throwE AllocationError) (pure . StackStore (fromIntegral (succ index) * (-4)))
|
|
|
|
$ temporaryRegisters' !? pred (length temporaryRegisters' - fromIntegral index)
|
|
|
|
storeVariable (ParameterVariable index) = do
|
|
|
|
temporaryRegisters' <- Allocator $ lift $ asks $ getField @"temporaryRegisters"
|
|
|
|
maybe (Allocator $ throwE AllocationError) (pure . StackStore (fromIntegral index * 4))
|
|
|
|
$ temporaryRegisters' !? fromIntegral index
|