mirror of
https://github.com/github/semantic.git
synced 2024-11-24 08:54:07 +03:00
🔥 Goto.
This commit is contained in:
parent
c3999b6acf
commit
b3b47a34df
@ -42,7 +42,6 @@ library
|
|||||||
, Control.Abstract.Environment
|
, Control.Abstract.Environment
|
||||||
, Control.Abstract.Evaluator
|
, Control.Abstract.Evaluator
|
||||||
, Control.Abstract.Exports
|
, Control.Abstract.Exports
|
||||||
, Control.Abstract.Goto
|
|
||||||
, Control.Abstract.Heap
|
, Control.Abstract.Heap
|
||||||
, Control.Abstract.Matching
|
, Control.Abstract.Matching
|
||||||
, Control.Abstract.Modules
|
, Control.Abstract.Modules
|
||||||
|
@ -9,7 +9,6 @@ import Control.Abstract.Environment as X
|
|||||||
import Control.Abstract.Evaluator as X
|
import Control.Abstract.Evaluator as X
|
||||||
import Control.Abstract.Exports as X
|
import Control.Abstract.Exports as X
|
||||||
import Control.Abstract.Heap as X
|
import Control.Abstract.Heap as X
|
||||||
import Control.Abstract.Goto as X
|
|
||||||
import Control.Abstract.Modules as X
|
import Control.Abstract.Modules as X
|
||||||
import Control.Abstract.Primitive as X
|
import Control.Abstract.Primitive as X
|
||||||
import Control.Abstract.Roots as X
|
import Control.Abstract.Roots as X
|
||||||
|
@ -1,79 +0,0 @@
|
|||||||
{-# LANGUAGE GADTs, TypeOperators #-}
|
|
||||||
module Control.Abstract.Goto
|
|
||||||
( GotoTable
|
|
||||||
, Label
|
|
||||||
, label
|
|
||||||
, goto
|
|
||||||
, Goto(..)
|
|
||||||
, runGoto
|
|
||||||
) where
|
|
||||||
|
|
||||||
import Control.Abstract.Evaluator
|
|
||||||
import Control.Monad.Effect.Internal
|
|
||||||
import qualified Data.IntMap as IntMap
|
|
||||||
import Prelude hiding (fail)
|
|
||||||
import Prologue
|
|
||||||
|
|
||||||
type GotoTable inner value = IntMap.IntMap (Eff (Goto inner value ': inner) value)
|
|
||||||
|
|
||||||
-- | The type of labels.
|
|
||||||
-- TODO: This should be rolled into 'Name' and tracked in the environment, both so that we can abstract over labels like any other location, and so that we can garbage collect unreachable labels.
|
|
||||||
type Label = Int
|
|
||||||
|
|
||||||
|
|
||||||
-- | Allocate a 'Label' for the given @term@.
|
|
||||||
--
|
|
||||||
-- Labels must be allocated before being jumped to with 'goto', but are suitable for nonlocal jumps; thus, they can be used to implement coroutines, exception handling, call with current continuation, and other esoteric control mechanisms.
|
|
||||||
label :: Evaluator location value (Goto effects value ': effects) value -> Evaluator location value (Goto effects value ': effects) Label
|
|
||||||
label = send . Label . lowerEff
|
|
||||||
|
|
||||||
-- | “Jump” to a previously-allocated 'Label' (retrieving the @term@ at which it points, which can then be evaluated.
|
|
||||||
goto :: Label -> Evaluator location value (Goto effects value ': effects) (Evaluator location value (Goto effects value ': effects) value)
|
|
||||||
goto = fmap raiseEff . send . Goto
|
|
||||||
|
|
||||||
|
|
||||||
-- | 'Goto' effects embed an 'Eff' action which can be run in the environment under the 'Goto' itself.
|
|
||||||
--
|
|
||||||
-- It’s tempting to try to use a 'Member' constraint to require a 'Goto' effect:
|
|
||||||
--
|
|
||||||
-- @
|
|
||||||
-- foo :: Member (Goto effects a) effects => Eff effects a
|
|
||||||
-- @
|
|
||||||
--
|
|
||||||
-- However, using this type would require that the type of the effect list include a reference to itself, which is forbidden by the occurs check: we wouldn’t be able to write a handler for 'Goto' if it could be used at that type. Instead, one can either use a smaller, statically known effect list inside the 'Goto', e.g. @Member (Goto outer) inner@ where @outer@ is a suffix of @inner@ (and with some massaging to raise the @outer@ actions into the @inner@ context), or use 'Goto' when it’s statically known to be the head of the list: @Eff (Goto rest a ': rest) b@. In either case, the 'Eff' actions embedded in the effect are themselves able to contain further 'Goto' effects,
|
|
||||||
data Goto effects value return where
|
|
||||||
Label :: Eff (Goto effects value ': effects) value -> Goto effects value Label
|
|
||||||
Goto :: Label -> Goto effects value (Eff (Goto effects value ': effects) value)
|
|
||||||
|
|
||||||
-- | Run a 'Goto' effect in terms of a 'State' effect holding a 'GotoTable', accessed via wrap/unwrap functions.
|
|
||||||
--
|
|
||||||
-- The wrap/unwrap functions are necessary in order for ghc to be able to typecheck the table, since it necessarily contains references to its own effect list. Since @GotoTable (… ': State (GotoTable … value) ': …) value@ can’t be written, and a recursive type equality constraint won’t typecheck, callers will need to employ a @newtype@ to break the self-reference. The effect list of the table the @newtype@ contains will include all of the effects between the 'Goto' effect and the 'State' effect (including the 'State' but not the 'Goto'). E.g. if the 'State' is the next effect, a valid wrapper would be∷
|
|
||||||
--
|
|
||||||
-- @
|
|
||||||
-- newtype Gotos effects value = Gotos { getGotos :: GotoTable (State (Gotos effects value) ': effects) value }
|
|
||||||
-- @
|
|
||||||
--
|
|
||||||
-- Callers can then evaluate the high-level 'Goto' effect by passing @Gotos@ and @getGotos@ to 'runGoto'.
|
|
||||||
runGoto :: ( Effectful (m location value)
|
|
||||||
, Members '[ Fail
|
|
||||||
, Fresh
|
|
||||||
, State table
|
|
||||||
] effects
|
|
||||||
)
|
|
||||||
=> (GotoTable effects value -> table)
|
|
||||||
-> (table -> GotoTable effects value)
|
|
||||||
-> m location value (Goto effects value ': effects) a
|
|
||||||
-> m location value effects a
|
|
||||||
runGoto from to = raiseHandler (interpret (\ goto -> do
|
|
||||||
table <- to <$> getTable
|
|
||||||
case goto of
|
|
||||||
Label action -> do
|
|
||||||
supremum <- fresh
|
|
||||||
supremum <$ putTable (from (IntMap.insert supremum action table))
|
|
||||||
Goto label -> maybeM (raiseEff (fail ("unknown label: " <> show label))) (IntMap.lookup label table)))
|
|
||||||
|
|
||||||
getTable :: (Effectful m, Member (State table) effects) => m effects table
|
|
||||||
getTable = get
|
|
||||||
|
|
||||||
putTable :: (Effectful m, Member (State table) effects) => table -> m effects ()
|
|
||||||
putTable = put
|
|
@ -34,19 +34,12 @@ evaluate
|
|||||||
. evaluating @Precise @(Value Precise ())
|
. evaluating @Precise @(Value Precise ())
|
||||||
. runReader (PackageInfo (name "test") Nothing mempty)
|
. runReader (PackageInfo (name "test") Nothing mempty)
|
||||||
. runReader (ModuleInfo "test/Control/Abstract/Evaluator/Spec.hs")
|
. runReader (ModuleInfo "test/Control/Abstract/Evaluator/Spec.hs")
|
||||||
. runTermEvaluator @() @Precise @(Value Precise ())
|
|
||||||
. Value.runValueError
|
. Value.runValueError
|
||||||
. TermEvaluator @() @Precise @(Value Precise ())
|
|
||||||
. runEnvironmentError
|
. runEnvironmentError
|
||||||
. runAddressError
|
. runAddressError
|
||||||
. runAllocator
|
. runAllocator
|
||||||
. runReturn
|
. runReturn
|
||||||
. runLoopControl
|
. runLoopControl
|
||||||
. fmap fst
|
|
||||||
. runState (Gotos lowerBound)
|
|
||||||
. runGoto Gotos getGotos
|
|
||||||
|
|
||||||
newtype Gotos effects = Gotos { getGotos :: GotoTable (State (Gotos effects) ': effects) (Value Precise ()) }
|
|
||||||
|
|
||||||
reassociate :: Either Prelude.String (Either (SomeExc exc1) (Either (SomeExc exc2) (Either (SomeExc exc3) result))) -> Either (SomeExc (Sum '[Const Prelude.String, exc1, exc2, exc3])) result
|
reassociate :: Either Prelude.String (Either (SomeExc exc1) (Either (SomeExc exc2) (Either (SomeExc exc3) result))) -> Either (SomeExc (Sum '[Const Prelude.String, exc1, exc2, exc3])) result
|
||||||
reassociate (Left s) = Left (SomeExc (inject (Const s)))
|
reassociate (Left s) = Left (SomeExc (inject (Const s)))
|
||||||
|
Loading…
Reference in New Issue
Block a user