Safe Haskell | None |
---|---|
Language | Haskell2010 |
Symantic.XML.Tree.Source
Contents
Synopsis
- type family Source (src :: * -> *) :: *
- class NoSource src where
- noSource :: a -> src a
- nullSource :: Source src -> Bool
- class UnSource src where
- unSource :: src a -> a
- class SourceOf src where
- newtype FileSource pos = FileSource (NonEmpty (FileRange pos))
- type FileSourced = Sourced (FileSource Offset)
- data FileRange pos = FileRange {
- fileRange_path :: FilePath
- fileRange_begin :: pos
- fileRange_end :: pos
- newtype Offset = Offset Int
- data LineColumn = LineColumn {}
- data Sourced src a = Sourced {}
Type family
Source
Class
NoSource
class NoSource src where Source #
Minimal complete definition
Methods
noSource :: a -> src a Source #
nullSource :: Source src -> Bool Source #
nullSource :: Eq (Source src) => SourceOf src => Source src -> Bool Source #
Instances
NoSource Identity Source # | |
NoSource (Sourced (FileSource Offset)) Source # | |
Defined in Symantic.XML.Tree.Source Methods noSource :: a -> Sourced (FileSource Offset) a Source # nullSource :: Source (Sourced (FileSource Offset)) -> Bool Source # |
Class
UnSource
Class
SourceOf
Type
FileSource
newtype FileSource pos Source #
Constructors
FileSource (NonEmpty (FileRange pos)) |
Instances
Type
FileSourced
type FileSourced = Sourced (FileSource Offset) Source #
Type
FileRange
Constructors
FileRange | |
Fields
|
Instances
Eq pos => Eq (FileRange pos) Source # | |
Ord pos => Ord (FileRange pos) Source # | |
Defined in Symantic.XML.Tree.Source Methods compare :: FileRange pos -> FileRange pos -> Ordering # (<) :: FileRange pos -> FileRange pos -> Bool # (<=) :: FileRange pos -> FileRange pos -> Bool # (>) :: FileRange pos -> FileRange pos -> Bool # (>=) :: FileRange pos -> FileRange pos -> Bool # | |
Show (FileRange LineColumn) Source # | |
Defined in Symantic.XML.Tree.Source | |
Show (FileRange Offset) Source # | |
Type
Offset
Instances
Type
LineColumn
data LineColumn Source #
Absolute text file position.
Constructors
LineColumn | |
Instances
Eq LineColumn Source # | |
Defined in Symantic.XML.Tree.Source | |
Ord LineColumn Source # | |
Defined in Symantic.XML.Tree.Source Methods compare :: LineColumn -> LineColumn -> Ordering # (<) :: LineColumn -> LineColumn -> Bool # (<=) :: LineColumn -> LineColumn -> Bool # (>) :: LineColumn -> LineColumn -> Bool # (>=) :: LineColumn -> LineColumn -> Bool # max :: LineColumn -> LineColumn -> LineColumn # min :: LineColumn -> LineColumn -> LineColumn # | |
Show LineColumn Source # | |
Defined in Symantic.XML.Tree.Source Methods showsPrec :: Int -> LineColumn -> ShowS # show :: LineColumn -> String # showList :: [LineColumn] -> ShowS # | |
Show (FileRange LineColumn) Source # | |
Defined in Symantic.XML.Tree.Source |