libGenI-0.16.1: A natural language generator (specifically, an FB-LTAG surface realiser)ContentsIndex
NLP.GenI.CkyEarley.CkyBuilder
Synopsis
ckyBuilder :: CkyBuilder
earleyBuilder :: CkyBuilder
data CkyStatus = S {
theAgenda :: Agenda
theChart :: Chart
theTrash :: Trash
tsemVector :: BitVector
theIafMap :: IafMap
gencounter :: Integer
genconfig :: Params
theRules :: [CKY_InferenceRule]
theDispatcher :: CkyItem -> CkyState (Maybe CkyItem)
theResults :: [CkyItem]
genAutCounter :: Integer
}
data CkyItem = CkyItem {
ciNode :: GNode
ciSourceTree :: TagElem
ciOrigVariables :: [GeniVal]
ciPolpaths :: BitVector
ciSemantics :: BitVector
ciAdjPoint :: Maybe ChartId
ciInitialSem :: BitVector
ciId :: ChartId
ciRouting :: RoutingMap
ciPayload :: [CkyItem]
ciVariables :: [GeniVal]
ciSemBitMap :: SemBitMap
ciTreeSide :: TreeSide
ciDiagnostic :: [String]
ciDerivation :: [ChartOperation]
ciAccesible :: [String]
ciInaccessible :: [String]
ciSubstnodes :: [TagSite]
}
type ChartId = Integer
ciAdjDone :: CkyItem -> Bool
ciRoot :: CkyItem -> Bool
extractDerivations :: CkyStatus -> CkyItem -> [Tree (ChartId, String)]
mJoinAutomata :: Maybe SentenceAut -> Maybe SentenceAut -> Maybe SentenceAut
mAutomatonPaths :: (Ord st, Ord ab) => Maybe (NFA st ab) -> [[ab]]
emptySentenceAut :: SentenceAut
unpackItemToAuts :: CkyStatus -> CkyItem -> SentenceAutPairMaybe
bitVectorToSem :: SemBitMap -> BitVector -> Sem
findId :: CkyStatus -> ChartId -> Maybe CkyItem
Documentation
ckyBuilder :: CkyBuilder
earleyBuilder :: CkyBuilder
data CkyStatus
Constructors
S
theAgenda :: Agenda
theChart :: Chart
theTrash :: Trash
tsemVector :: BitVector
theIafMap :: IafMap
gencounter :: Integer
genconfig :: Params
theRules :: [CKY_InferenceRule]
theDispatcher :: CkyItem -> CkyState (Maybe CkyItem)
theResults :: [CkyItem]
genAutCounter :: Integer
data CkyItem
Constructors
CkyItem
ciNode :: GNode
ciSourceTree :: TagElem
ciOrigVariables :: [GeniVal]
ciPolpaths :: BitVector
ciSemantics :: BitVector
ciAdjPoint :: Maybe ChartId
ciInitialSem :: BitVectorthe semantics of the item when it was first initialised
ciId :: ChartIdunique identifier for this item
ciRouting :: RoutingMap
ciPayload :: [CkyItem]
ciVariables :: [GeniVal]
ciSemBitMap :: SemBitMap
ciTreeSide :: TreeSide
ciDiagnostic :: [String]
ciDerivation :: [ChartOperation]
ciAccesible :: [String]
ciInaccessible :: [String]
ciSubstnodes :: [TagSite]
show/hide Instances
type ChartId = Integer
ciAdjDone :: CkyItem -> Bool
ciRoot :: CkyItem -> Bool
extractDerivations :: CkyStatus -> CkyItem -> [Tree (ChartId, String)]
Returns all the derivations trees for this item: note that this is not a TAG derivation tree but a history of inference rule applications in tree form
mJoinAutomata :: Maybe SentenceAut -> Maybe SentenceAut -> Maybe SentenceAut
mAutomatonPaths :: (Ord st, Ord ab) => Maybe (NFA st ab) -> [[ab]]
emptySentenceAut :: SentenceAut
unpackItemToAuts :: CkyStatus -> CkyItem -> SentenceAutPairMaybe
bitVectorToSem :: SemBitMap -> BitVector -> Sem
findId :: CkyStatus -> ChartId -> Maybe CkyItem
Produced by Haddock version 2.1.0