rubyhs/src/Rubyhs/References.hs

270 lines
7.6 KiB
Haskell
Raw Normal View History

2019-10-11 09:08:36 +00:00
{-# LANGUAGE DuplicateRecordFields, OverloadedLists, InstanceSigs #-}
2019-10-16 18:12:07 +00:00
-- {-# OPTIONS_GHC -Wall #-}
2019-10-03 14:13:34 +00:00
module Rubyhs.References
( References(entries)
, Entry(..)
, FQN(..)
, references
2019-10-11 09:08:36 +00:00
, Env(..)
2019-10-11 09:37:11 +00:00
, Result(..)
2019-10-11 12:03:01 +00:00
, Namespace(..)
, Context(..)
2019-10-16 18:12:07 +00:00
, graph
, prettyContext
, Node(..)
2019-10-03 14:13:34 +00:00
) where
import Frelude
2019-10-11 12:03:01 +00:00
import Data.Language.Ruby hiding (Namespace)
import qualified Data.Language.Ruby as Ruby
2019-10-11 09:08:36 +00:00
import Data.Map (Map)
2019-10-03 14:13:34 +00:00
import qualified Data.Map as Map
import Data.Kind
import Control.Monad.State
import qualified Data.Aeson as Aeson
2019-10-11 12:03:01 +00:00
import Data.Set (Set)
import qualified Data.Set as Set
2019-10-15 18:46:28 +00:00
import qualified Data.Text as Text
import Data.Coerce
2019-10-16 18:12:07 +00:00
import Data.Graph (Graph, Vertex, Forest)
import qualified Data.Graph as Graph
span :: G node key -> Forest node
span (g, f, _) = fmap ((\(x, _, _) -> x) . f) <$> Graph.dff g
type G node key = (Graph, Vertex -> (node, key, [key]), key -> Maybe Vertex)
graph :: Block -> Forest Node
graph b = span $ Graph.graphFromEdges $ go <$> toList ys
where
go :: (Node, Set Node) -> (Node, Text, [Text])
go (x, xs) = (x, prettyContext x, prettyContext <$> toList xs)
Result ys = references b
2019-10-03 14:13:34 +00:00
data Entry a = Entry
{ node :: a
, fqn :: FQN
}
2019-10-11 12:03:01 +00:00
newtype Namespace = Namespace [Text]
deriving stock instance Show Namespace
deriving stock instance Eq Namespace
deriving stock instance Ord Namespace
instance IsList Namespace where
type Item Namespace = Text
2019-10-15 19:50:19 +00:00
fromList = coerce
toList = coerce
2019-10-11 12:03:01 +00:00
deriving newtype instance Semigroup Namespace
deriving newtype instance Monoid Namespace
2019-10-15 18:46:28 +00:00
instance ToJSON Namespace where
2019-10-15 19:50:19 +00:00
toJSON = Aeson.String . showNamespace
showNamespace :: Namespace -> Text
showNamespace = Text.intercalate "::" . coerce
2019-10-11 12:03:01 +00:00
2019-10-11 09:37:11 +00:00
-- Names are in reverse order.
2019-10-11 12:03:01 +00:00
data FQN = FQN
{ namespace :: Namespace
, name :: Text
}
2019-10-03 14:13:34 +00:00
2019-10-15 18:46:28 +00:00
data Node = NodeFunction FQN | NodeModule Namespace
deriving stock instance Show Node
deriving stock instance Eq Node
deriving stock instance Ord Node
instance ToJSON Node where
toJSON = \case
NodeFunction q -> Aeson.toJSON q
NodeModule m -> Aeson.toJSON m
2019-10-11 09:08:36 +00:00
deriving stock instance Show FQN
2019-10-11 12:03:01 +00:00
deriving stock instance Eq FQN
deriving stock instance Ord FQN
instance Pretty Namespace where
2019-10-15 19:50:19 +00:00
pretty = pretty . showNamespace
2019-10-11 12:03:01 +00:00
instance Aeson.ToJSON FQN where
toJSON = Aeson.String . prettyFQN
2019-10-11 09:08:36 +00:00
instance Aeson.ToJSONKey FQN where
instance Pretty FQN where
2019-10-11 12:03:01 +00:00
pretty = pretty . prettyFQN
prettyFQN :: FQN -> Text
2019-10-15 18:46:28 +00:00
prettyFQN FQN{name, namespace} = case namespace of
2019-10-11 12:03:01 +00:00
[] -> name
2019-10-15 19:50:19 +00:00
_ -> convertString (showNamespace namespace) <> "." <> name
2019-10-03 14:13:34 +00:00
2019-10-15 18:46:28 +00:00
newtype Context = Context Node
deriving stock instance Eq Context
deriving stock instance Ord Context
2019-10-15 18:46:28 +00:00
deriving newtype instance ToJSON Context
2019-10-03 14:13:34 +00:00
class Monad m => MyMonad (m :: Type -> Type) where
2019-10-15 18:46:28 +00:00
declaration :: Node -> m ()
application :: Node -> Node -> m ()
getContext :: m Context
writeContext :: Context -> m ()
2019-10-03 14:13:34 +00:00
data Env = Env
2019-10-15 18:46:28 +00:00
{ declarations :: Set Node
, applications :: Map Node (Set Node)
, context :: Context
2019-10-03 14:13:34 +00:00
}
2019-10-16 18:12:07 +00:00
newtype Result = Result (Map Node (Set Node))
2019-10-11 09:37:11 +00:00
instance ToJSON Result where
2019-10-16 18:12:07 +00:00
toJSON (Result a) = Aeson.Object $ fromList $ go <$> toList a
2019-10-11 09:37:11 +00:00
where
2019-10-16 18:12:07 +00:00
go :: (Node, Set Node) -> (Text, Aeson.Value)
go (x, y) = (prettyContext x, Aeson.toJSON y)
2019-10-11 09:37:11 +00:00
2019-10-15 18:46:28 +00:00
prettyContext :: Node -> Text
prettyContext = \case
2019-10-15 18:46:28 +00:00
NodeFunction fun -> prettyFQN fun
2019-10-15 19:50:19 +00:00
NodeModule ns -> showNamespace ns
2019-10-03 14:13:34 +00:00
instance MyMonad (State Env) where
2019-10-11 12:03:01 +00:00
declaration q = modify go
2019-10-03 14:13:34 +00:00
where
2019-10-11 09:37:11 +00:00
go :: Env -> Env
2019-10-11 12:03:01 +00:00
go env@Env{declarations} = env { declarations = Set.insert q declarations }
2019-10-03 14:13:34 +00:00
application q n = modify go
where
2019-10-11 09:37:11 +00:00
go :: Env -> Env
2019-10-11 12:03:01 +00:00
go env@Env{applications} = env { applications = Map.insertWith mappend q (Set.singleton n) applications }
2019-10-03 14:13:34 +00:00
getContext = gets context
writeContext q = modify go
where
go env = env { context = q }
updateContext :: MyMonad m => (Context -> Context) -> m ()
2019-10-03 14:13:34 +00:00
updateContext f = getContext >>= \c -> writeContext (f c)
locally :: MyMonad m => m a -> m a
locally act = do
old <- getContext
res <- act
writeContext old
pure res
appendToContext :: MyMonad m => Name -> m ()
appendToContext n = updateContext go
where
2019-10-15 18:46:28 +00:00
go (Context (NodeModule q)) = Context $ NodeModule $ name2ns n <> q
go (Context NodeFunction{}) = error "Cannot append module to context in function context"
2019-10-11 12:03:01 +00:00
name2ns :: Name -> Namespace
name2ns (Name o) = go o
where
go :: Aeson.Value -> Namespace
go = \case
Aeson.Array [Aeson.String "const", x, Aeson.String s] -> case x of
Aeson.Null -> [s]
_ -> go x <> [s]
_ -> error $ show o
2019-10-03 14:13:34 +00:00
class References a where
entries :: MyMonad m => a -> m ()
2019-10-11 09:37:11 +00:00
references :: Block -> Result
2019-10-16 18:12:07 +00:00
references q = Result $ Map.unionWith mappend applications declarations'
2019-10-11 09:37:11 +00:00
where
Env{declarations,applications} = execState (entries @_ @(State Env) q) emptyEnv
2019-10-15 18:46:28 +00:00
emptyEnv = Env mempty mempty (Context $ NodeModule mempty)
2019-10-16 18:12:07 +00:00
declarations' = fromList $ (\x -> (x, mempty)) <$> toList declarations
2019-10-03 14:13:34 +00:00
instance References Block where
entries :: forall m . MyMonad m => Block -> m ()
entries (Block defs) = traverse_ (locally . entries) defs
2019-10-14 18:25:09 +00:00
instance References Statement where
2019-10-03 14:13:34 +00:00
entries = \case
2019-10-15 18:46:28 +00:00
StmtModule m -> entries m
2019-10-14 18:25:09 +00:00
StmtFunction f -> entries f
2019-10-15 18:46:28 +00:00
StmtSend s -> entries s
StmtConst c -> entries c
2019-10-16 20:12:30 +00:00
StmtRBlock b -> entries b
StmtCasgn c -> entries c
StmtArray a -> entries a
StmtAnything a -> entries a
-- TODO
instance References Ruby.RBlock where
entries = const $ pure ()
instance References Ruby.Casgn where
entries = const $ pure ()
instance References Ruby.RArray where
entries = const $ pure ()
instance References Ruby.Anything where
entries = const $ pure ()
2019-10-03 14:13:34 +00:00
2019-10-15 18:46:28 +00:00
instance References Ruby.Namespace where
entries = \case
Ruby.Namespace xs -> do
Context c <- getContext
2019-10-15 19:50:19 +00:00
let
ctxt = case c of
NodeFunction FQN{namespace} -> namespace
NodeModule namespace -> namespace
-- TODO Hacky:
ns = Namespace ((\(Name (Aeson.String t)) -> t) <$> xs)
2019-10-16 18:12:07 +00:00
-- TODO: Broken
-- application c (NodeModule $ ctxt `onTop` ns)
application c (NodeModule $ ns)
2019-10-15 18:46:28 +00:00
2019-10-03 14:13:34 +00:00
instance References Module where
entries Module{name, block} = do
appendToContext name
2019-10-15 18:46:28 +00:00
c <- getContext >>= \case
Context (NodeModule c) -> pure c
_ -> error "..."
declaration $ NodeModule c
2019-10-03 14:13:34 +00:00
entries block
instance References Function where
entries Function{name, block} = do
namespace <- getContext >>= \case
2019-10-15 18:46:28 +00:00
Context (NodeModule c) -> pure c
Context NodeFunction{} -> error "Cannot have a function declaration in a function context"
declaration $ NodeFunction $ qual namespace name
locally $ do
2019-10-15 18:46:28 +00:00
writeContext (Context $ NodeFunction $ qual namespace name)
entries block
2019-10-03 14:13:34 +00:00
2019-10-11 12:03:01 +00:00
qual :: Namespace -> Name -> FQN
qual namespace (Name o) = case o of
Aeson.String name -> FQN { namespace , name }
_ -> error $ show o
2019-10-15 19:50:19 +00:00
onTop' :: Eq a => [a] -> [a] -> [a]
onTop' [] y = y
onTop' x [] = x
onTop' (x:xss) ys@(y:yss) = if
| x == y -> pure x <> yss
| otherwise -> pure x <> xss `onTop'` ys
onTop :: Namespace -> Namespace -> Namespace
onTop (Namespace xs) (Namespace ys) = Namespace $ reverse $ reverse xs `onTop'` reverse ys
2019-10-03 14:13:34 +00:00
instance References Send where
2019-10-11 12:03:01 +00:00
entries Send{namespace, name} = do
2019-10-15 18:46:28 +00:00
Context c <- getContext
2019-10-15 19:50:19 +00:00
let
ctxt = case c of
NodeFunction FQN{namespace = ns} -> ns
NodeModule ns -> ns
2019-10-16 18:12:07 +00:00
-- TODO: Broken
-- application c $ NodeFunction $ qual (ctxt `onTop` fromNS namespace) name
application c $ NodeFunction $ qual (fromNS namespace) name
2019-10-11 12:03:01 +00:00
where
fromNS :: Ruby.Namespace -> Namespace
fromNS (Ruby.Namespace l) = Namespace $ go <$> l
go :: Name -> Text
go (Name o) = case o of
Aeson.String s -> s
_ -> error $ show o