2015-12-09 17:58:15 +03:00
|
|
|
|
module TreeSitter where
|
|
|
|
|
|
|
|
|
|
import Diff
|
|
|
|
|
import Range
|
|
|
|
|
import Syntax
|
|
|
|
|
import Term
|
|
|
|
|
import Control.Comonad.Cofree
|
2015-12-15 01:12:47 +03:00
|
|
|
|
import qualified OrderedMap as Map
|
2015-12-16 23:49:46 +03:00
|
|
|
|
import qualified Data.Set as Set
|
2015-12-09 17:58:15 +03:00
|
|
|
|
import Foreign
|
|
|
|
|
import Foreign.C
|
|
|
|
|
import Foreign.C.Types
|
|
|
|
|
|
|
|
|
|
data TSLanguage = TsLanguage deriving (Show, Eq)
|
2015-12-09 18:11:30 +03:00
|
|
|
|
foreign import ccall "prototype/doubt-difftool/doubt-difftool-Bridging-Header.h ts_language_c" ts_language_c :: Ptr TSLanguage
|
|
|
|
|
foreign import ccall "prototype/doubt-difftool/doubt-difftool-Bridging-Header.h ts_language_javascript" ts_language_javascript :: Ptr TSLanguage
|
2015-12-09 17:58:15 +03:00
|
|
|
|
|
|
|
|
|
data TSDocument = TsDocument deriving (Show, Eq)
|
|
|
|
|
foreign import ccall "prototype/External/tree-sitter/include/tree_sitter/runtime.h ts_document_make" ts_document_make :: IO (Ptr TSDocument)
|
|
|
|
|
foreign import ccall "prototype/External/tree-sitter/include/tree_sitter/runtime.h ts_document_set_language" ts_document_set_language :: Ptr TSDocument -> Ptr TSLanguage -> IO ()
|
|
|
|
|
foreign import ccall "prototype/External/tree-sitter/include/tree_sitter/runtime.h ts_document_set_input_string" ts_document_set_input_string :: Ptr TSDocument -> CString -> IO ()
|
|
|
|
|
foreign import ccall "prototype/External/tree-sitter/include/tree_sitter/runtime.h ts_document_parse" ts_document_parse :: Ptr TSDocument -> IO ()
|
|
|
|
|
foreign import ccall "prototype/External/tree-sitter/include/tree_sitter/runtime.h ts_document_free" ts_document_free :: Ptr TSDocument -> IO ()
|
|
|
|
|
|
|
|
|
|
data TSLength = TsLength { bytes :: CSize, chars :: CSize }
|
|
|
|
|
deriving (Show, Eq)
|
|
|
|
|
|
|
|
|
|
data TSNode = TsNode { _data :: Ptr (), offset :: TSLength }
|
|
|
|
|
deriving (Show, Eq)
|
|
|
|
|
|
|
|
|
|
instance Storable TSNode where
|
2015-12-14 23:52:39 +03:00
|
|
|
|
alignment _ = 24
|
|
|
|
|
sizeOf _ = 24
|
|
|
|
|
peek _ = error "Haskell code should never read TSNode values directly."
|
|
|
|
|
poke _ _ = error "Haskell code should never write TSNode values directly."
|
2015-12-09 17:58:15 +03:00
|
|
|
|
|
|
|
|
|
foreign import ccall "app/bridge.h ts_document_root_node_p" ts_document_root_node_p :: Ptr TSDocument -> Ptr TSNode -> IO ()
|
|
|
|
|
foreign import ccall "app/bridge.h ts_node_p_name" ts_node_p_name :: Ptr TSNode -> Ptr TSDocument -> IO CString
|
|
|
|
|
foreign import ccall "app/bridge.h ts_node_p_named_child_count" ts_node_p_named_child_count :: Ptr TSNode -> IO CSize
|
|
|
|
|
foreign import ccall "app/bridge.h ts_node_p_named_child" ts_node_p_named_child :: Ptr TSNode -> CSize -> Ptr TSNode -> IO CSize
|
|
|
|
|
foreign import ccall "app/bridge.h ts_node_p_pos_chars" ts_node_p_pos_chars :: Ptr TSNode -> IO CSize
|
|
|
|
|
foreign import ccall "app/bridge.h ts_node_p_size_chars" ts_node_p_size_chars :: Ptr TSNode -> IO CSize
|
|
|
|
|
|
2015-12-16 23:59:07 +03:00
|
|
|
|
-- | Given a source string and a term’s annotation & production/child pairs, construct the term.
|
|
|
|
|
type Constructor = String -> Info -> [(String, Term String Info)] -> Term String Info
|
2015-12-16 23:41:36 +03:00
|
|
|
|
|
2015-12-16 23:49:46 +03:00
|
|
|
|
keyedProductions :: Set.Set String
|
|
|
|
|
keyedProductions = Set.fromList [ "object" ]
|
2015-12-09 17:58:15 +03:00
|
|
|
|
|
2015-12-16 23:49:46 +03:00
|
|
|
|
fixedProductions :: Set.Set String
|
|
|
|
|
fixedProductions = Set.fromList [ "pair", "rel_op", "math_op", "bool_op", "bitwise_op", "type_op", "math_assignment", "assignment", "subscript_access", "member_access", "new_expression", "function_call", "function", "ternary" ]
|
2015-12-09 17:58:15 +03:00
|
|
|
|
|
2015-12-16 23:55:12 +03:00
|
|
|
|
-- | Given two sets of production names, produce a Constructor.
|
|
|
|
|
constructorForProductions :: Set.Set String -> Set.Set String -> Constructor
|
2015-12-17 00:01:26 +03:00
|
|
|
|
constructorForProductions keyed fixed source info@(Info range categories) = (info :<) . construct
|
|
|
|
|
where construct [] = Leaf (substring range source)
|
2015-12-17 00:01:43 +03:00
|
|
|
|
construct children | not . Set.null $ Set.intersection fixed categories = Fixed $ fmap snd children
|
2015-12-17 00:02:59 +03:00
|
|
|
|
construct children | not . Set.null $ Set.intersection keyed categories = Keyed . Map.fromList $ assignKey <$> children
|
2015-12-17 00:01:36 +03:00
|
|
|
|
construct children = Indexed $ fmap snd children
|
2015-12-17 00:02:59 +03:00
|
|
|
|
assignKey ("pair", node@(_ :< Fixed (key : _))) = (getSubstring key, node)
|
|
|
|
|
assignKey (_, node) = (getSubstring node, node)
|
|
|
|
|
getSubstring (Info range _ :< _) = substring range source
|
2015-12-17 00:01:26 +03:00
|
|
|
|
|
2015-12-17 00:03:15 +03:00
|
|
|
|
data Language = Language { getConstructor :: Constructor, getTsLanguage :: Ptr TSLanguage }
|
|
|
|
|
|
2015-12-17 00:05:24 +03:00
|
|
|
|
languageForType :: String -> Maybe Language
|
2015-12-15 22:39:54 +03:00
|
|
|
|
languageForType mediaType = case mediaType of
|
2015-12-17 00:05:24 +03:00
|
|
|
|
".h" -> Just $ Language (constructorForProductions mempty mempty) ts_language_c
|
|
|
|
|
".c" -> Just $ Language (constructorForProductions mempty mempty) ts_language_c
|
|
|
|
|
".js" -> Just $ Language (constructorForProductions keyedProductions fixedProductions) ts_language_javascript
|
2015-12-15 22:39:54 +03:00
|
|
|
|
_ -> Nothing
|
|
|
|
|
|
2015-12-17 00:05:24 +03:00
|
|
|
|
parseTreeSitterFile :: Language -> String -> IO (Term String Info)
|
|
|
|
|
parseTreeSitterFile (Language constructor language) contents = do
|
2015-12-09 17:58:15 +03:00
|
|
|
|
document <- ts_document_make
|
|
|
|
|
ts_document_set_language document language
|
|
|
|
|
withCString contents (\source -> do
|
|
|
|
|
ts_document_set_input_string document source
|
|
|
|
|
ts_document_parse document
|
2015-12-17 00:06:06 +03:00
|
|
|
|
term <- documentToTerm constructor document contents
|
2015-12-09 17:58:15 +03:00
|
|
|
|
ts_document_free document
|
|
|
|
|
return term)
|
|
|
|
|
|
2015-12-17 00:06:06 +03:00
|
|
|
|
documentToTerm :: Constructor -> Ptr TSDocument -> String -> IO (Term String Info)
|
|
|
|
|
documentToTerm constructor document contents = alloca $ \root -> do
|
2015-12-09 17:58:15 +03:00
|
|
|
|
ts_document_root_node_p document root
|
|
|
|
|
snd <$> toTerm root where
|
|
|
|
|
toTerm :: Ptr TSNode -> IO (String, Term String Info)
|
|
|
|
|
toTerm node = do
|
|
|
|
|
name <- ts_node_p_name node document
|
|
|
|
|
name <- peekCString name
|
|
|
|
|
children <- withNamedChildren node toTerm
|
|
|
|
|
range <- range node
|
2015-12-17 00:08:10 +03:00
|
|
|
|
return (name, constructor contents (Info range $ Set.singleton name) children)
|
2015-12-09 17:58:15 +03:00
|
|
|
|
|
|
|
|
|
withNamedChildren :: Ptr TSNode -> (Ptr TSNode -> IO (String, a)) -> IO [(String, a)]
|
|
|
|
|
withNamedChildren node transformNode = do
|
|
|
|
|
count <- ts_node_p_named_child_count node
|
|
|
|
|
if count == 0
|
|
|
|
|
then return []
|
|
|
|
|
else mapM (alloca . getChild) [0..pred count] where
|
|
|
|
|
getChild n out = do
|
2015-12-14 23:52:39 +03:00
|
|
|
|
_ <- ts_node_p_named_child node n out
|
2015-12-09 17:58:15 +03:00
|
|
|
|
transformNode out
|
|
|
|
|
|
|
|
|
|
range :: Ptr TSNode -> IO Range
|
|
|
|
|
range node = do
|
|
|
|
|
pos <- ts_node_p_pos_chars node
|
|
|
|
|
size <- ts_node_p_size_chars node
|
|
|
|
|
let start = fromIntegral pos
|
|
|
|
|
end = start + fromIntegral size
|
|
|
|
|
return Range { start = start, end = end }
|