mirror of
https://github.com/github/semantic.git
synced 2024-12-24 23:42:31 +03:00
Update the imports.
This commit is contained in:
parent
d6ea1b752f
commit
f8ab5f2ae3
@ -115,7 +115,7 @@ import GHC.Stack
|
||||
import qualified Info
|
||||
import Prelude hiding (head, until)
|
||||
import Text.Parser.Combinators as Parsers
|
||||
import Text.Parser.TreeSitter.Language
|
||||
import TreeSitter.Language
|
||||
|
||||
-- | Assignment from an AST with some set of 'symbol's onto some other value.
|
||||
--
|
||||
|
@ -2,8 +2,8 @@
|
||||
module Language.Go.Syntax where
|
||||
|
||||
import Language.Haskell.TH
|
||||
import Text.Parser.TreeSitter.Go
|
||||
import Text.Parser.TreeSitter.Language
|
||||
import TreeSitter.Go
|
||||
import TreeSitter.Language
|
||||
|
||||
-- | Statically-known rules corresponding to symbols in the grammar.
|
||||
mkSymbolDatatype (mkName "Grammar") tree_sitter_go
|
||||
|
@ -2,8 +2,8 @@
|
||||
module Language.JSON.Grammar where
|
||||
|
||||
import Language.Haskell.TH
|
||||
import Text.Parser.TreeSitter.Language
|
||||
import Text.Parser.TreeSitter.JSON
|
||||
import TreeSitter.Language
|
||||
import TreeSitter.JSON
|
||||
|
||||
-- | Statically-known rules corresponding to symbols in the grammar.
|
||||
-- v2 - bump this to regenerate
|
||||
|
@ -11,7 +11,7 @@ import Data.Ix
|
||||
import Data.Source
|
||||
import qualified Data.Syntax.Assignment as A (AST, Node(..))
|
||||
import Info
|
||||
import Text.Parser.TreeSitter.Language (Symbol(..), SymbolType(..))
|
||||
import TreeSitter.Language (Symbol(..), SymbolType(..))
|
||||
|
||||
data Grammar
|
||||
= Document
|
||||
|
@ -2,8 +2,8 @@
|
||||
module Language.Python.Grammar where
|
||||
|
||||
import Language.Haskell.TH
|
||||
import Text.Parser.TreeSitter.Language
|
||||
import Text.Parser.TreeSitter.Python
|
||||
import TreeSitter.Language
|
||||
import TreeSitter.Python
|
||||
|
||||
-- | Statically-known rules corresponding to symbols in the grammar.
|
||||
-- v3 - bump this to regenerate
|
||||
|
@ -2,8 +2,8 @@
|
||||
module Language.Ruby.Grammar where
|
||||
|
||||
import Language.Haskell.TH
|
||||
import Text.Parser.TreeSitter.Language
|
||||
import Text.Parser.TreeSitter.Ruby
|
||||
import TreeSitter.Language
|
||||
import TreeSitter.Ruby
|
||||
|
||||
-- v2 - Bump to get file to change to force template haskell to regenerate.
|
||||
-- | Statically-known rules corresponding to symbols in the grammar.
|
||||
|
@ -2,8 +2,8 @@
|
||||
module Language.TypeScript.Syntax where
|
||||
|
||||
import Language.Haskell.TH
|
||||
import Text.Parser.TreeSitter.Language
|
||||
import Text.Parser.TreeSitter.TypeScript
|
||||
import TreeSitter.Language
|
||||
import TreeSitter.TypeScript
|
||||
|
||||
-- | Statically-known rules corresponding to symbols in the grammar.
|
||||
mkSymbolDatatype (mkName "Grammar") tree_sitter_typescript
|
||||
|
@ -30,13 +30,13 @@ import qualified Language.Python.Syntax as Python
|
||||
import qualified Language.Ruby.Syntax as Ruby
|
||||
import Syntax hiding (Go)
|
||||
import Term
|
||||
import qualified Text.Parser.TreeSitter as TS
|
||||
import Text.Parser.TreeSitter.Language (Symbol)
|
||||
import Text.Parser.TreeSitter.Go
|
||||
import Text.Parser.TreeSitter.Python
|
||||
import Text.Parser.TreeSitter.Ruby
|
||||
import Text.Parser.TreeSitter.TypeScript
|
||||
import Text.Parser.TreeSitter.JSON
|
||||
import qualified TreeSitter as TS
|
||||
import TreeSitter.Language (Symbol)
|
||||
import TreeSitter.Go
|
||||
import TreeSitter.Python
|
||||
import TreeSitter.Ruby
|
||||
import TreeSitter.TypeScript
|
||||
import TreeSitter.JSON
|
||||
|
||||
-- | A parser from 'Source' onto some term type.
|
||||
data Parser term where
|
||||
|
@ -27,11 +27,11 @@ import Foreign.C.String (peekCString)
|
||||
import Foreign.Marshal.Array (allocaArray)
|
||||
import qualified Syntax as S
|
||||
import Term
|
||||
import Text.Parser.TreeSitter hiding (Language(..))
|
||||
import qualified Text.Parser.TreeSitter as TS
|
||||
import qualified Text.Parser.TreeSitter.Go as TS
|
||||
import qualified Text.Parser.TreeSitter.Ruby as TS
|
||||
import qualified Text.Parser.TreeSitter.TypeScript as TS
|
||||
import TreeSitter hiding (Language(..))
|
||||
import qualified TreeSitter as TS
|
||||
import qualified TreeSitter.Go as TS
|
||||
import qualified TreeSitter.Ruby as TS
|
||||
import qualified TreeSitter.TypeScript as TS
|
||||
import Info
|
||||
|
||||
-- | Returns a TreeSitter parser for the given language and TreeSitter grammar.
|
||||
|
@ -14,7 +14,7 @@ import Data.Syntax.Assignment
|
||||
import GHC.Stack (getCallStack)
|
||||
import Prelude hiding (words)
|
||||
import Test.Hspec
|
||||
import Text.Parser.TreeSitter.Language (Symbol(..), SymbolType(..))
|
||||
import TreeSitter.Language (Symbol(..), SymbolType(..))
|
||||
|
||||
spec :: Spec
|
||||
spec = do
|
||||
|
Loading…
Reference in New Issue
Block a user