GenI-0.17.3: A natural language generator (specifically, an FB-LTAG surface realiser)

NLP.GenI.Configuration

Synopsis

Documentation

data Params Source

Holds the specification for how Geni should be run, its input files, etc. This is the stuff that would normally be found in the configuration file.

Instances

data GrammarType Source

Constructors

GeniHand

geni's text format

PreCompiled

built into geni, no parsing needed

PreAnchored

lexical selection already done

data Flag Source

Instances

data HelpFlg Source

Constructors

HelpFlg () 

getFlagP :: (Show f, Show x, Typeable f, Typeable x) => (x -> f) -> Params -> Maybe xSource

getListFlagP :: (Show f, Show x, Typeable f, Typeable x) => ([x] -> f) -> Params -> [x]Source

setFlagP :: (Eq f, Show f, Show x, Typeable f, Typeable x) => (x -> f) -> x -> Params -> ParamsSource

hasFlagP :: (Typeable f, Typeable x) => (x -> f) -> Params -> BoolSource

deleteFlagP :: (Typeable f, Typeable x) => (x -> f) -> Params -> ParamsSource

getFlag :: (Show f, Show x, Typeable f, Typeable x) => (x -> f) -> [Flag] -> Maybe xSource

setFlag :: (Eq f, Show f, Show x, Typeable f, Typeable x) => (x -> f) -> x -> [Flag] -> [Flag]Source

hasFlag :: (Typeable f, Typeable x) => (x -> f) -> [Flag] -> BoolSource

emptyParams :: ParamsSource

The default parameters configuration

optionsForStandardGenI :: [OptDescr Flag]Source

Uses the GetOpt library to process the command line arguments. Note that we divide them into basic and advanced usage.

noArg :: forall f. (Eq f, Show f, Typeable f) => (() -> f) -> ArgDescr FlagSource

reqArgSource

Arguments

:: forall f x . (Eq f, Show f, Typeable f, Eq x, Show x, Typeable x) 
=> (x -> f)

flag

-> (String -> x)

string reader for flag (probably |id| if already a String)

-> String

description

-> ArgDescr Flag 

optArgSource

Arguments

:: forall f x . (Eq f, Show f, Typeable f, Eq x, Show x, Typeable x) 
=> (x -> f)

flag

-> x

default value

-> (String -> x)

string reader (as in reqArg)

-> String

description

-> ArgDescr Flag 

class Typeable a

The class Typeable allows a concrete representation of a type to be calculated.

Instances

Typeable Bool 
Typeable Char 
Typeable Double 
Typeable Float 
Typeable Int 
Typeable Int8 
Typeable Int16 
Typeable Int32 
Typeable Int64 
Typeable Integer 
Typeable Ordering 
Typeable RealWorld 
Typeable Word 
Typeable Word8 
Typeable Word16 
Typeable Word32 
Typeable Word64 
Typeable () 
Typeable Handle 
Typeable Handle__ 
Typeable Exception 
Typeable DataType 
Typeable ThreadId 
Typeable BlockedIndefinitelyOnMVar 
Typeable BlockedIndefinitelyOnSTM 
Typeable Deadlock 
Typeable AssertionFailed 
Typeable AsyncException 
Typeable ArrayException 
Typeable ExitCode 
Typeable Dynamic 
Typeable IOException 
Typeable SomeException 
Typeable ErrorCall 
Typeable ArithException 
Typeable TypeRep 
Typeable TyCon 
Typeable LocalTime 
Typeable ZonedTime 
Typeable TimeOut 
Typeable GeniVal 
Typeable GType 
Typeable GNode 
Typeable ILexEntry 
Typeable Ptype 
Typeable WeirdFlg 
Typeable GrammarTypeFlg 
Typeable BuilderFlg 
Typeable ViewCmdFlg 
Typeable VerboseModeFlg 
Typeable TimeoutFlg 
Typeable TestSuiteFlg 
Typeable TestInstructionsFlg 
Typeable TestCaseFlg 
Typeable StatsFileFlg 
Typeable NoLoadTestSuiteFlg 
Typeable RunUnitTestFlg 
Typeable RootFeatureFlg 
Typeable RegressionTestModeFlg 
Typeable PartialFlg 
Typeable OutputFileFlg 
Typeable OptimisationsFlg 
Typeable MorphLexiconFlg 
Typeable MorphInfoFlg 
Typeable MorphCmdFlg 
Typeable MetricsFlg 
Typeable MaxTreesFlg 
Typeable TracesFlg 
Typeable MacrosFlg 
Typeable LexiconFlg 
Typeable InstructionsFileFlg 
Typeable IgnoreSemanticsFlg 
Typeable HelpFlg 
Typeable FromStdinFlg 
Typeable ExtraPolaritiesFlg 
Typeable EarlyDeathFlg 
Typeable DisableGuiFlg 
Typeable BatchDirFlg 
Typeable Flag 
Typeable GrammarType 
Typeable BuilderType 
Typeable Optimisation 
(Typeable1 s, Typeable a) => Typeable (s a)