corenlp-types-0.1.0.0: Types for interaction with CoreNLP
Safe HaskellSafe-Inferred
LanguageHaskell2010

Text.CoreNLP.Types

Synopsis

Documentation

data Dependency Source #

Constructors

Dependency 

Instances

Instances details
FromJSON Dependency Source # 
Instance details

Defined in Text.CoreNLP.Types

ToJSON Dependency Source # 
Instance details

Defined in Text.CoreNLP.Types

Generic Dependency Source # 
Instance details

Defined in Text.CoreNLP.Types

Associated Types

type Rep Dependency :: Type -> Type #

Show Dependency Source # 
Instance details

Defined in Text.CoreNLP.Types

Eq Dependency Source # 
Instance details

Defined in Text.CoreNLP.Types

type Rep Dependency Source # 
Instance details

Defined in Text.CoreNLP.Types

type Rep Dependency = D1 ('MetaData "Dependency" "Text.CoreNLP.Types" "corenlp-types-0.1.0.0-2DumPMRiaEV1NyyJtzdI9D" 'False) (C1 ('MetaCons "Dependency" 'PrefixI 'True) ((S1 ('MetaSel ('Just "dep") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text) :*: S1 ('MetaSel ('Just "governor") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int)) :*: (S1 ('MetaSel ('Just "governorGloss") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text) :*: (S1 ('MetaSel ('Just "dependent") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int) :*: S1 ('MetaSel ('Just "dependentGloss") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)))))

data Entitymention Source #

Instances

Instances details
FromJSON Entitymention Source # 
Instance details

Defined in Text.CoreNLP.Types

ToJSON Entitymention Source # 
Instance details

Defined in Text.CoreNLP.Types

Generic Entitymention Source # 
Instance details

Defined in Text.CoreNLP.Types

Associated Types

type Rep Entitymention :: Type -> Type #

Show Entitymention Source # 
Instance details

Defined in Text.CoreNLP.Types

Eq Entitymention Source # 
Instance details

Defined in Text.CoreNLP.Types

type Rep Entitymention Source # 
Instance details

Defined in Text.CoreNLP.Types

data Token Source #

Instances

Instances details
FromJSON Token Source # 
Instance details

Defined in Text.CoreNLP.Types

ToJSON Token Source # 
Instance details

Defined in Text.CoreNLP.Types

Generic Token Source # 
Instance details

Defined in Text.CoreNLP.Types

Associated Types

type Rep Token :: Type -> Type #

Methods

from :: Token -> Rep Token x #

to :: Rep Token x -> Token #

Show Token Source # 
Instance details

Defined in Text.CoreNLP.Types

Methods

showsPrec :: Int -> Token -> ShowS #

show :: Token -> String #

showList :: [Token] -> ShowS #

Eq Token Source # 
Instance details

Defined in Text.CoreNLP.Types

Methods

(==) :: Token -> Token -> Bool #

(/=) :: Token -> Token -> Bool #

type Rep Token Source # 
Instance details

Defined in Text.CoreNLP.Types

data Sentence Source #

Instances

Instances details
FromJSON Sentence Source # 
Instance details

Defined in Text.CoreNLP.Types

ToJSON Sentence Source # 
Instance details

Defined in Text.CoreNLP.Types

Generic Sentence Source # 
Instance details

Defined in Text.CoreNLP.Types

Associated Types

type Rep Sentence :: Type -> Type #

Methods

from :: Sentence -> Rep Sentence x #

to :: Rep Sentence x -> Sentence #

Show Sentence Source # 
Instance details

Defined in Text.CoreNLP.Types

Eq Sentence Source # 
Instance details

Defined in Text.CoreNLP.Types

type Rep Sentence Source # 
Instance details

Defined in Text.CoreNLP.Types

type Rep Sentence = D1 ('MetaData "Sentence" "Text.CoreNLP.Types" "corenlp-types-0.1.0.0-2DumPMRiaEV1NyyJtzdI9D" 'False) (C1 ('MetaCons "Sentence" 'PrefixI 'True) ((S1 ('MetaSel ('Just "index") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int) :*: (S1 ('MetaSel ('Just "parse") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Text)) :*: S1 ('MetaSel ('Just "basicDependencies") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Dependency]))) :*: ((S1 ('MetaSel ('Just "enhancedDependencies") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Dependency]) :*: S1 ('MetaSel ('Just "enhancedPlusPlusDependencies") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Dependency])) :*: (S1 ('MetaSel ('Just "entitymentions") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Entitymention]) :*: S1 ('MetaSel ('Just "tokens") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Token])))))

data PennPOS Source #

Constructors

CC

Coordinating conjunction

CD

Cardinal number

DT

Determiner

EX

Existential *there*

FW

Foreign word

IN

Preposition or subordinating conjunction

JJ

Adjective

JJR

Adjective, comparative

JJS

Adjective, superlative

LS

List item marker

MD

Modal

NN

Noun, singular or mass

NNS

Noun, plural

NNP

Proper noun, singular

NNPS

Proper noun, plural

PDT

Predeterminer

POS

Possessive ending

PRP

Personal pronoun

PRPDollar

Possessive pronoun

RB

Adverb

RBR

Adverb, comparative

RBS

Adverb, superlative

RP

Particle

SYM

Symbol

TO
  • to*
UH

Interjection

VB

Verb, base form

VBD

Verb, past tense

VBG

Verb, gerund or present participle

VBN

Verb, past participle

VBP

Verb, non-3rd person singular present

VBZ

Verb, 3rd person singular present

WDT

Wh-determiner

WP

Wh-pronoun

WPDollar

Possessive wh-pronoun

WRB

Wh-adverb

LRB

"-LRB-"? No idea what's this

RRB

"-RRB-"? No idea what's this

PosPunctuation

anyOf ".:,''$#$,", sometimes few together

Instances

Instances details
FromJSON PennPOS Source # 
Instance details

Defined in Text.CoreNLP.Types

ToJSON PennPOS Source # 
Instance details

Defined in Text.CoreNLP.Types

Generic PennPOS Source # 
Instance details

Defined in Text.CoreNLP.Types

Associated Types

type Rep PennPOS :: Type -> Type #

Methods

from :: PennPOS -> Rep PennPOS x #

to :: Rep PennPOS x -> PennPOS #

Show PennPOS Source # 
Instance details

Defined in Text.CoreNLP.Types

Eq PennPOS Source # 
Instance details

Defined in Text.CoreNLP.Types

Methods

(==) :: PennPOS -> PennPOS -> Bool #

(/=) :: PennPOS -> PennPOS -> Bool #

type Rep PennPOS Source # 
Instance details

Defined in Text.CoreNLP.Types

type Rep PennPOS = D1 ('MetaData "PennPOS" "Text.CoreNLP.Types" "corenlp-types-0.1.0.0-2DumPMRiaEV1NyyJtzdI9D" 'False) (((((C1 ('MetaCons "CC" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "CD" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "DT" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "EX" 'PrefixI 'False) (U1 :: Type -> Type))) :+: ((C1 ('MetaCons "FW" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "IN" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "JJ" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "JJR" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "JJS" 'PrefixI 'False) (U1 :: Type -> Type))))) :+: (((C1 ('MetaCons "LS" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "MD" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "NN" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "NNS" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "NNP" 'PrefixI 'False) (U1 :: Type -> Type)))) :+: ((C1 ('MetaCons "NNPS" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "PDT" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "POS" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "PRP" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "PRPDollar" 'PrefixI 'False) (U1 :: Type -> Type)))))) :+: ((((C1 ('MetaCons "RB" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "RBR" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "RBS" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "RP" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "SYM" 'PrefixI 'False) (U1 :: Type -> Type)))) :+: ((C1 ('MetaCons "TO" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "UH" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "VB" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "VBD" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "VBG" 'PrefixI 'False) (U1 :: Type -> Type))))) :+: (((C1 ('MetaCons "VBN" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "VBP" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "VBZ" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "WDT" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "WP" 'PrefixI 'False) (U1 :: Type -> Type)))) :+: ((C1 ('MetaCons "WPDollar" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "WRB" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "LRB" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "RRB" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "PosPunctuation" 'PrefixI 'False) (U1 :: Type -> Type)))))))

data Coref Source #

Instances

Instances details
FromJSON Coref Source # 
Instance details

Defined in Text.CoreNLP.Types

ToJSON Coref Source # 
Instance details

Defined in Text.CoreNLP.Types

Generic Coref Source # 
Instance details

Defined in Text.CoreNLP.Types

Associated Types

type Rep Coref :: Type -> Type #

Methods

from :: Coref -> Rep Coref x #

to :: Rep Coref x -> Coref #

Show Coref Source # 
Instance details

Defined in Text.CoreNLP.Types

Methods

showsPrec :: Int -> Coref -> ShowS #

show :: Coref -> String #

showList :: [Coref] -> ShowS #

Eq Coref Source # 
Instance details

Defined in Text.CoreNLP.Types

Methods

(==) :: Coref -> Coref -> Bool #

(/=) :: Coref -> Coref -> Bool #

type Rep Coref Source # 
Instance details

Defined in Text.CoreNLP.Types

data Document Source #

Constructors

Document 

Instances

Instances details
FromJSON Document Source # 
Instance details

Defined in Text.CoreNLP.Types

ToJSON Document Source # 
Instance details

Defined in Text.CoreNLP.Types

Generic Document Source # 
Instance details

Defined in Text.CoreNLP.Types

Associated Types

type Rep Document :: Type -> Type #

Methods

from :: Document -> Rep Document x #

to :: Rep Document x -> Document #

Show Document Source # 
Instance details

Defined in Text.CoreNLP.Types

Eq Document Source # 
Instance details

Defined in Text.CoreNLP.Types

type Rep Document Source # 
Instance details

Defined in Text.CoreNLP.Types

type Rep Document = D1 ('MetaData "Document" "Text.CoreNLP.Types" "corenlp-types-0.1.0.0-2DumPMRiaEV1NyyJtzdI9D" 'False) (C1 ('MetaCons "Document" 'PrefixI 'True) (S1 ('MetaSel ('Just "docId") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Text)) :*: (S1 ('MetaSel ('Just "sentences") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Sentence]) :*: S1 ('MetaSel ('Just "corefs") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Corefs)))))

data NamedEntity Source #

See https://stanfordnlp.github.io/CoreNLP/ner.html

Instances

Instances details
FromJSON NamedEntity Source # 
Instance details

Defined in Text.CoreNLP.Types

ToJSON NamedEntity Source # 
Instance details

Defined in Text.CoreNLP.Types

Generic NamedEntity Source # 
Instance details

Defined in Text.CoreNLP.Types

Associated Types

type Rep NamedEntity :: Type -> Type #

Show NamedEntity Source # 
Instance details

Defined in Text.CoreNLP.Types

Eq NamedEntity Source # 
Instance details

Defined in Text.CoreNLP.Types

type Rep NamedEntity Source # 
Instance details

Defined in Text.CoreNLP.Types

type Rep NamedEntity = D1 ('MetaData "NamedEntity" "Text.CoreNLP.Types" "corenlp-types-0.1.0.0-2DumPMRiaEV1NyyJtzdI9D" 'False) ((((C1 ('MetaCons "PERSON" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "LOCATION" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "ORGANIZATION" 'PrefixI 'False) (U1 :: Type -> Type))) :+: (C1 ('MetaCons "MISC" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "MONEY" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "NUMBER" 'PrefixI 'False) (U1 :: Type -> Type)))) :+: ((C1 ('MetaCons "ORDINAL" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "PERCENT" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "DATE" 'PrefixI 'False) (U1 :: Type -> Type))) :+: (C1 ('MetaCons "TIME" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "DURATION" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "SET" 'PrefixI 'False) (U1 :: Type -> Type))))) :+: (((C1 ('MetaCons "EMAIL" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "URL" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "CITY" 'PrefixI 'False) (U1 :: Type -> Type))) :+: (C1 ('MetaCons "STATE_OR_PROVINCE" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "COUNTRY" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "NATIONALITY" 'PrefixI 'False) (U1 :: Type -> Type)))) :+: ((C1 ('MetaCons "RELIGION" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "TITLE" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "IDEOLOGY" 'PrefixI 'False) (U1 :: Type -> Type))) :+: (C1 ('MetaCons "CRIMINAL_CHARGE" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "CAUSE_OF_DEATH" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "O" 'PrefixI 'False) (U1 :: Type -> Type))))))