haskell-token-utils-0.0.0.4: Utilities to tie up tokens to an AST

Safe HaskellSafe-Inferred

Language.Haskell.TokenUtils.Types

Synopsis

Documentation

data Entry a Source

An entry in the data structure for a particular srcspan.

Constructors

Entry !ForestSpan !Layout ![a]

Entry has * the source span contained in this Node * how the sub-elements nest * the tokens for the SrcSpan if subtree is empty

Deleted !ForestSpan !RowOffset !SimpPos

Deleted has * the source span has been deleted * prior gap in lines * the gap between this span end and the start of the next in the fringe of the tree.

data TokenCache a Source

Constructors

TK 

Fields

tkCache :: !(Map TreeId (Tree (Entry a)))
 
tkLastTreeId :: !TreeId
 

data TreeId Source

Constructors

TId !Int 

Instances

mainTid :: TreeIdSource

Identifies the tree carrying the main tokens, not any work in progress or deleted ones

type ForestSpan = (ForestPos, ForestPos)Source

Match a SrcSpan, using a ForestLine as the marker

data ForestLine Source

Constructors

ForestLine 

Fields

flSpanLengthChanged :: !Bool

The length of the span may have changed due to updated tokens.

flTreeSelector :: !Int
 
flInsertVersion :: !Int
 
flLine :: !Int
 

type Row = IntSource

type Col = IntSource

data Layout Source

Constructors

Above EndOffset (Row, Col) (Row, Col) EndOffset

Initial offset from token before the stacked list of items, the (r,c) of the first non-comment token, the (r,c) of the end of the last non-comment token in the stacked list to be able to calculate the (RowOffset,ColOffset) between the last token and the start of the next item.

NoChange 

ghcLineToForestLine :: Int -> ForestLineSource

Extract an encoded ForestLine from a GHC line

class (Show a, HasLoc a) => IsToken a whereSource

The IsToken class captures the different token type in use. For GHC it represents the type returned by getRichTokenStream, namely [(GHC.Located GHC.Token, String)] For haskell-src-exts this is the reult of lexTokenStream, namely `[HSE.Loc HSE.Token]`

Methods

tokenLen :: a -> IntSource

tokenLen returns the length of the string representation of the token, not just the difference in the location, as the string may have changed without the position being updated, e.g. in a renaming

isComment :: a -> BoolSource

isEmpty :: a -> BoolSource

Zero-length tokens, as appear in GHC as markers

mkZeroToken :: aSource

isDo :: a -> BoolSource

isElse :: a -> BoolSource

isIn :: a -> BoolSource

isLet :: a -> BoolSource

isOf :: a -> BoolSource

isThen :: a -> BoolSource

isWhere :: a -> BoolSource

tokenToString :: a -> StringSource

showTokenStream :: [a] -> StringSource

lexStringToTokens :: SimpSpan -> String -> [a]Source

Create a stream of tokens from source, with first token start at given location

markToken :: a -> aSource

Mark a token so that it can be use to trigger layout checking later when the toks are retrieved

isMarked :: a -> BoolSource

isIgnoredNonComment :: IsToken a => a -> BoolSource

Tokens that are ignored when determining the first non-comment token in a span

class Allocatable b a whereSource

Methods

allocTokens :: IsToken a => b -> [a] -> LayoutTree aSource

Construct a LayoutTree from a Haskell AST and a stream of tokens.

Instances

Allocatable ParsedSource GhcPosToken 
Allocatable (Module SrcSpanInfo) (Loc TuToken)

This instance is the purpose of this module