1
1
mirror of https://github.com/github/semantic.git synced 2024-12-26 00:12:29 +03:00

Remove unnecessary Applicative constraint from locate.

Now that syntax comes with paths, `locate` doesn't need to ask any
calling context for path information, so this function can be pure. I
was a fan of the way that the `>>= locate it` pattern looked, but this
is simpler and, given some slight textual fixups, as readable as before.
This commit is contained in:
Patrick Thomson 2019-10-10 17:53:56 -04:00
parent 2c07349295
commit 4a9d1ec28c

View File

@ -13,7 +13,6 @@ import AST.Element
import Control.Effect hiding ((:+:)) import Control.Effect hiding ((:+:))
import Control.Effect.Reader import Control.Effect.Reader
import Control.Monad.Fail import Control.Monad.Fail
import Control.Monad ((>=>))
import Data.Coerce import Data.Coerce
import Data.Core as Core import Data.Core as Core
import Data.Foldable import Data.Foldable
@ -83,13 +82,12 @@ none :: (Member Core sig, Carrier sig t) => t Name
none = unit none = unit
locate :: ( HasField "ann" syntax Span locate :: ( HasField "ann" syntax Span
, CoreSyntax syn t , CoreSyntax syn t
, Applicative m )
) => syntax
=> syntax -> t a
-> t a -> t a
-> m (t a) locate syn = Core.annAt (getField @"ann" syn)
locate syn item = pure (Core.annAt (getField @"ann" syn) item)
defaultCompile :: (MonadFail m, Show py) => py -> m (t Name) defaultCompile :: (MonadFail m, Show py) => py -> m (t Name)
defaultCompile t = fail $ "compilation unimplemented for " <> show t defaultCompile t = fail $ "compilation unimplemented for " <> show t
@ -161,7 +159,7 @@ instance Compile Py.Assignment where
, ann , ann
} cc next = do } cc next = do
(names, val) <- desugar [Located ann name] rhs (names, val) <- desugar [Located ann name] rhs
compile val pure next >>= foldr collapseDesugared cc names >>= locate it locate it <$> compile val pure next >>= foldr collapseDesugared cc names
compile other _ _ = fail ("Unhandled assignment case: " <> show other) compile other _ _ = fail ("Unhandled assignment case: " <> show other)
@ -172,7 +170,9 @@ instance Compile Py.Await
instance Compile Py.BinaryOperator instance Compile Py.BinaryOperator
instance Compile Py.Block where instance Compile Py.Block where
compile it@Py.Block{ Py.extraChildren = body} cc = foldr compile cc body >=> locate it compile it@Py.Block{ Py.extraChildren = body} cc
= fmap (locate it)
. foldr compile cc body
instance Compile Py.BooleanOperator instance Compile Py.BooleanOperator
instance Compile Py.BreakStatement instance Compile Py.BreakStatement
@ -195,20 +195,20 @@ instance Compile Py.ExecStatement
deriving instance Compile Py.Expression deriving instance Compile Py.Expression
instance Compile Py.ExpressionStatement where instance Compile Py.ExpressionStatement where
compile it@Py.ExpressionStatement compile it@Py.ExpressionStatement { Py.extraChildren = children } cc
{ Py.extraChildren = children = fmap (locate it)
} cc = do . foldr compile cc children
foldr compile cc children >=> locate it
instance Compile Py.ExpressionList where instance Compile Py.ExpressionList where
compile it@Py.ExpressionList { Py.extraChildren = [child] } cc compile it@Py.ExpressionList { Py.extraChildren = [child] } cc
= compile child cc >=> locate it = fmap (locate it)
. compile child cc
compile Py.ExpressionList { Py.extraChildren = items } _ compile Py.ExpressionList { Py.extraChildren = items } _
= const (fail ("unimplemented: ExpressionList of length " <> show items)) = const (fail ("unimplemented: ExpressionList of length " <> show items))
instance Compile Py.False where instance Compile Py.False where
compile it cc _ = locate it (bool False) >>= cc compile it cc _ = cc $ locate it (bool False)
instance Compile Py.Float instance Compile Py.Float
instance Compile Py.ForStatement instance Compile Py.ForStatement
@ -223,7 +223,7 @@ instance Compile Py.FunctionDefinition where
parameters' <- traverse param parameters parameters' <- traverse param parameters
body' <- compile body pure next body' <- compile body pure next
-- Build a lambda. -- Build a lambda.
located <- locate it (lams parameters' body') let located = locate it (lams parameters' body')
-- Give it a name (below), then augment the current continuation -- Give it a name (below), then augment the current continuation
-- with the new name (with 'def'), so that calling contexts know -- with the new name (with 'def'), so that calling contexts know
-- that we have built an exportable definition. -- that we have built an exportable definition.
@ -242,9 +242,9 @@ instance Compile Py.Identifier where
instance Compile Py.IfStatement where instance Compile Py.IfStatement where
compile it@Py.IfStatement{ condition, consequence, alternative} cc next = compile it@Py.IfStatement{ condition, consequence, alternative} cc next =
locate it =<< if' <$> compile condition pure next locate it <$> (if' <$> compile condition pure next
<*> compile consequence cc next <*> compile consequence cc next
<*> foldr clause (cc next) alternative <*> foldr clause (cc next) alternative)
where clause (R1 Py.ElseClause{ body }) _ = compile body cc next where clause (R1 Py.ElseClause{ body }) _ = compile body cc next
clause (L1 Py.ElifClause{ condition, consequence }) rest = clause (L1 Py.ElifClause{ condition, consequence }) rest =
if' <$> compile condition pure next <*> compile consequence cc next <*> rest if' <$> compile condition pure next <*> compile consequence cc next <*> rest
@ -268,7 +268,7 @@ instance Compile Py.Module where
bindings <- asks @Bindings (toList . unBindings) bindings <- asks @Bindings (toList . unBindings)
let buildName n = (n, pure n) let buildName n = (n, pure n)
pure . record . fmap buildName $ bindings pure . record . fmap buildName $ bindings
in foldr compile buildRecord stmts >=> locate it in fmap (locate it) . foldr compile buildRecord stmts
instance Compile Py.NamedExpression instance Compile Py.NamedExpression
instance Compile Py.None instance Compile Py.None
@ -277,16 +277,16 @@ instance Compile Py.NotOperator
instance Compile Py.ParenthesizedExpression instance Compile Py.ParenthesizedExpression
instance Compile Py.PassStatement where instance Compile Py.PassStatement where
compile it@Py.PassStatement {} cc _ = locate it Core.unit >>= cc compile it@Py.PassStatement {} cc _ = cc $ locate it Core.unit
deriving instance Compile Py.PrimaryExpression deriving instance Compile Py.PrimaryExpression
instance Compile Py.PrintStatement instance Compile Py.PrintStatement
instance Compile Py.ReturnStatement where instance Compile Py.ReturnStatement where
compile it@Py.ReturnStatement { Py.extraChildren = vals } _ next = case vals of compile it@Py.ReturnStatement { Py.extraChildren = vals } _ next = locate it <$> case vals of
Nothing -> locate it $ none Nothing -> pure none
Just Py.ExpressionList { extraChildren = [val] } -> compile val pure next >>= locate it Just Py.ExpressionList { extraChildren = [val] } -> compile val pure next
Just Py.ExpressionList { extraChildren = vals } -> fail ("unimplemented: return statement returning " <> show (length vals) <> " values") Just Py.ExpressionList { extraChildren = vals } -> fail ("unimplemented: return statement returning " <> show (length vals) <> " values")
@ -300,12 +300,12 @@ instance Compile Py.String
instance Compile Py.Subscript instance Compile Py.Subscript
instance Compile Py.True where instance Compile Py.True where
compile it cc _next = locate it (bool True) >>= cc compile it cc _next = cc $ locate it (bool True)
instance Compile Py.TryStatement instance Compile Py.TryStatement
instance Compile Py.Tuple where instance Compile Py.Tuple where
compile it@Py.Tuple { Py.extraChildren = [] } cc _ = locate it unit >>= cc compile it@Py.Tuple { Py.extraChildren = [] } cc _ = cc $ locate it unit
compile it _ _ compile it _ _
= fail ("Unimplemented: non-empty tuple " <> show it) = fail ("Unimplemented: non-empty tuple " <> show it)