haskell-conll-0.1.0.2: Core Types for NLP

Safe HaskellNone
LanguageHaskell2010

Model.PennTreebank

Synopsis

Documentation

data POS Source #

(Penn) Treebank Tag-set For documentation see http://www.comp.leeds.ac.uk/amalgam/tagsets/upenn.html

Constructors

CC 
CD 
ClosePar (SpelledAs ")") 
Colon (SpelledAs ":") 
Coma (SpelledAs ",") 
Dash (SpelledAs "--") 
Dollar (SpelledAs "$") 
DT 
EX 
FW 
IN 
JJ 
JJR 
JJS 
LRB_ (SpelledAs "-LRB-") 
LS 
MD 
NN 
NNP 
NNPS 
NNS 
OpenPar (SpelledAs "(") 
PDT 
POS 
PRP 
PRP_Dollar (SpelledAs "PRP$") 
Quotes (SpelledAs "''") 
Quotes2 (SpelledAs "``") 
RB 
RBR 
RBS 
RP 
RRB_ (SpelledAs "-RRB-") 
SYM 
Terminator (SpelledAs ".") 
TO 
UH 
VB 
VBD 
VBG 
VBN 
VBP 
VBZ 
WDT 
WP 
WP_Dollar (SpelledAs "WP$") 
WRB 
UNKNOWN 
Instances
Eq POS Source # 
Instance details

Defined in Model.PennTreebank

Methods

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

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

Ord POS Source # 
Instance details

Defined in Model.PennTreebank

Methods

compare :: POS -> POS -> Ordering #

(<) :: POS -> POS -> Bool #

(<=) :: POS -> POS -> Bool #

(>) :: POS -> POS -> Bool #

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

max :: POS -> POS -> POS #

min :: POS -> POS -> POS #

Read POS Source # 
Instance details

Defined in Model.PennTreebank

Show POS Source # 
Instance details

Defined in Model.PennTreebank

Methods

showsPrec :: Int -> POS -> ShowS #

show :: POS -> String #

showList :: [POS] -> ShowS #

Generic POS Source # 
Instance details

Defined in Model.PennTreebank

Associated Types

type Rep POS :: Type -> Type #

Methods

from :: POS -> Rep POS x #

to :: Rep POS x -> POS #

TagLabel POS Source # 
Instance details

Defined in Model.PennTreebank

type Rep POS Source # 
Instance details

Defined in Model.PennTreebank

type Rep POS = D1 (MetaData "POS" "Model.PennTreebank" "haskell-conll-0.1.0.2-56cdOp3D6saLMUJmPcyMc2" False) (((((C1 (MetaCons "CC" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "CD" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "ClosePar" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (SpelledAs ")"))))) :+: (C1 (MetaCons "Colon" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (SpelledAs ":"))) :+: (C1 (MetaCons "Coma" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (SpelledAs ","))) :+: C1 (MetaCons "Dash" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (SpelledAs "--")))))) :+: ((C1 (MetaCons "Dollar" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (SpelledAs "$"))) :+: (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 "LRB_" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (SpelledAs "-LRB-"))))) :+: (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 "NNP" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "NNPS" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "NNS" PrefixI False) (U1 :: Type -> Type))) :+: (C1 (MetaCons "OpenPar" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (SpelledAs "("))) :+: (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 "PRP_Dollar" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (SpelledAs "PRP$"))) :+: C1 (MetaCons "Quotes" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (SpelledAs "''"))))) :+: (C1 (MetaCons "Quotes2" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (SpelledAs "``"))) :+: (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 "RRB_" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (SpelledAs "-RRB-"))))) :+: (C1 (MetaCons "SYM" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "Terminator" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (SpelledAs "."))) :+: 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 "WP_Dollar" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (SpelledAs "WP$"))) :+: (C1 (MetaCons "WRB" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "UNKNOWN" PrefixI False) (U1 :: Type -> Type)))))))