Search is not available for this dataset
repo_name
string | path
string | license
string | full_code
string | full_size
int64 | uncommented_code
string | uncommented_size
int64 | function_only_code
string | function_only_size
int64 | is_commented
bool | is_signatured
bool | n_ast_errors
int64 | ast_max_depth
int64 | n_whitespaces
int64 | n_ast_nodes
int64 | n_ast_terminals
int64 | n_ast_nonterminals
int64 | loc
int64 | cycloplexity
int64 |
---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|
svenssonjoel/EmbArBB | Intel/ArBB/Backend/ArBB/CodeGen.hs | bsd-3-clause | opToArBB Split = VM.ArbbOpSplit | 31 | opToArBB Split = VM.ArbbOpSplit | 31 | opToArBB Split = VM.ArbbOpSplit | 31 | false | false | 0 | 5 | 3 | 11 | 5 | 6 | null | null |
markrgrant/regression | src/Regression/HMatrix.hs | bsd-3-clause | -- Calculates the gradient of the residual sum of squares (-2H^t(y-Hw)).
-- This is used to compute the magnitude of the gradient, to see if the
-- function is minimized. It is also used to update the weights of the
-- features.
gradient :: Matrix Double -> Matrix Double -> Vector Double ->
Vector Double -> Vector Double
gradient h ht y w =
let yhat = h #> w
err = y - yhat
prod = ht #> err
grad = cmap (*(-2)) prod
in grad | 463 | gradient :: Matrix Double -> Matrix Double -> Vector Double ->
Vector Double -> Vector Double
gradient h ht y w =
let yhat = h #> w
err = y - yhat
prod = ht #> err
grad = cmap (*(-2)) prod
in grad | 232 | gradient h ht y w =
let yhat = h #> w
err = y - yhat
prod = ht #> err
grad = cmap (*(-2)) prod
in grad | 134 | true | true | 0 | 12 | 124 | 112 | 56 | 56 | null | null |
wavewave/madgraph-auto-dataset | src/HEP/Automation/MadGraph/Dataset/Set20110425set2.hs | gpl-3.0 | psetuplist :: [ProcessSetup ZpHFull]
psetuplist = [ psetup_zphfull_TTBar ] | 74 | psetuplist :: [ProcessSetup ZpHFull]
psetuplist = [ psetup_zphfull_TTBar ] | 74 | psetuplist = [ psetup_zphfull_TTBar ] | 37 | false | true | 0 | 6 | 8 | 20 | 11 | 9 | null | null |
lueck/standoff-tools | src/StandOff/AttributesMap.hs | gpl-3.0 | -- | Debugging: USAGE:
-- stack runghc src/StandOff/AttributesMap.hs
main :: IO ()
main = parseMapping "utils/mappings/som-tei.yaml" >>= print | 142 | main :: IO ()
main = parseMapping "utils/mappings/som-tei.yaml" >>= print | 73 | main = parseMapping "utils/mappings/som-tei.yaml" >>= print | 59 | true | true | 0 | 6 | 17 | 25 | 13 | 12 | null | null |
vincenthz/hs-crypto-cipher-types | Crypto/Cipher/Types.hs | bsd-3-clause | key :: (ToSecureMem b, Cipher c) => b -> Maybe (Key c)
key b = toKey undefined (toSecureMem b)
where toKey :: Cipher c => c -> SecureMem -> Maybe (Key c)
toKey cipher sm =
case cipherKeySize cipher of
Nothing -> Just $ Key sm
Just sz | sz == byteableLength sm -> Just $ Key sm
| otherwise -> Nothing | 417 | key :: (ToSecureMem b, Cipher c) => b -> Maybe (Key c)
key b = toKey undefined (toSecureMem b)
where toKey :: Cipher c => c -> SecureMem -> Maybe (Key c)
toKey cipher sm =
case cipherKeySize cipher of
Nothing -> Just $ Key sm
Just sz | sz == byteableLength sm -> Just $ Key sm
| otherwise -> Nothing | 417 | key b = toKey undefined (toSecureMem b)
where toKey :: Cipher c => c -> SecureMem -> Maybe (Key c)
toKey cipher sm =
case cipherKeySize cipher of
Nothing -> Just $ Key sm
Just sz | sz == byteableLength sm -> Just $ Key sm
| otherwise -> Nothing | 362 | false | true | 4 | 12 | 179 | 152 | 71 | 81 | null | null |
RTS2013/RTS | server/dist/build/autogen/Paths_rts_server.hs | mit | prefix, bindirrel :: FilePath
prefix = "C:\\Users\\Zach\\Documents\\GitHub\\RTS\\server\\.cabal-sandbox" | 111 | prefix, bindirrel :: FilePath
prefix = "C:\\Users\\Zach\\Documents\\GitHub\\RTS\\server\\.cabal-sandbox" | 111 | prefix = "C:\\Users\\Zach\\Documents\\GitHub\\RTS\\server\\.cabal-sandbox" | 81 | false | true | 2 | 6 | 13 | 24 | 9 | 15 | null | null |
acowley/ghc | compiler/main/DynFlags.hs | bsd-3-clause | whenGeneratingDynamicToo :: MonadIO m => DynFlags -> m () -> m ()
whenGeneratingDynamicToo dflags f = ifGeneratingDynamicToo dflags f (return ()) | 145 | whenGeneratingDynamicToo :: MonadIO m => DynFlags -> m () -> m ()
whenGeneratingDynamicToo dflags f = ifGeneratingDynamicToo dflags f (return ()) | 145 | whenGeneratingDynamicToo dflags f = ifGeneratingDynamicToo dflags f (return ()) | 79 | false | true | 0 | 9 | 20 | 56 | 26 | 30 | null | null |
headprogrammingczar/acme-microwave | Data/Microwave.hs | bsd-3-clause | -- turn display time into raw seconds
normalize (Microwave n) = let (mins, secs) = n `quotRem` 100 in 60 * mins + secs | 118 | normalize (Microwave n) = let (mins, secs) = n `quotRem` 100 in 60 * mins + secs | 80 | normalize (Microwave n) = let (mins, secs) = n `quotRem` 100 in 60 * mins + secs | 80 | true | false | 0 | 9 | 23 | 48 | 25 | 23 | null | null |
travitch/shellDSL | src/Shell/Render.hs | bsd-3-clause | writeLine :: PP.Doc -> Render ()
writeLine doc =
MS.modify $ \s -> s { sBuilder = sBuilder s <> doc <> PP.line } | 114 | writeLine :: PP.Doc -> Render ()
writeLine doc =
MS.modify $ \s -> s { sBuilder = sBuilder s <> doc <> PP.line } | 114 | writeLine doc =
MS.modify $ \s -> s { sBuilder = sBuilder s <> doc <> PP.line } | 81 | false | true | 0 | 11 | 25 | 57 | 29 | 28 | null | null |
infotroph/pandoc | src/Text/Pandoc/Writers/AsciiDoc.hs | gpl-2.0 | inlineToAsciiDoc opts (Image attr alternate (src, tit)) = do
-- image:images/logo.png[Company logo, title="blah"]
let txt = if (null alternate) || (alternate == [Str ""])
then [Str "image"]
else alternate
linktext <- inlineListToAsciiDoc opts txt
let linktitle = if null tit
then empty
else ",title=\"" <> text tit <> "\""
showDim dir = case (dimension dir attr) of
Just (Percent a) ->
["scaledwidth=" <> text (show (Percent a))]
Just dim ->
[text (show dir) <> "=" <> text (showInPixel opts dim)]
Nothing ->
[]
dimList = showDim Width ++ showDim Height
dims = if null dimList
then empty
else "," <> cat (intersperse "," dimList)
return $ "image:" <> text src <> "[" <> linktext <> linktitle <> dims <> "]" | 991 | inlineToAsciiDoc opts (Image attr alternate (src, tit)) = do
-- image:images/logo.png[Company logo, title="blah"]
let txt = if (null alternate) || (alternate == [Str ""])
then [Str "image"]
else alternate
linktext <- inlineListToAsciiDoc opts txt
let linktitle = if null tit
then empty
else ",title=\"" <> text tit <> "\""
showDim dir = case (dimension dir attr) of
Just (Percent a) ->
["scaledwidth=" <> text (show (Percent a))]
Just dim ->
[text (show dir) <> "=" <> text (showInPixel opts dim)]
Nothing ->
[]
dimList = showDim Width ++ showDim Height
dims = if null dimList
then empty
else "," <> cat (intersperse "," dimList)
return $ "image:" <> text src <> "[" <> linktext <> linktitle <> dims <> "]" | 991 | inlineToAsciiDoc opts (Image attr alternate (src, tit)) = do
-- image:images/logo.png[Company logo, title="blah"]
let txt = if (null alternate) || (alternate == [Str ""])
then [Str "image"]
else alternate
linktext <- inlineListToAsciiDoc opts txt
let linktitle = if null tit
then empty
else ",title=\"" <> text tit <> "\""
showDim dir = case (dimension dir attr) of
Just (Percent a) ->
["scaledwidth=" <> text (show (Percent a))]
Just dim ->
[text (show dir) <> "=" <> text (showInPixel opts dim)]
Nothing ->
[]
dimList = showDim Width ++ showDim Height
dims = if null dimList
then empty
else "," <> cat (intersperse "," dimList)
return $ "image:" <> text src <> "[" <> linktext <> linktitle <> dims <> "]" | 991 | false | false | 0 | 19 | 404 | 302 | 149 | 153 | null | null |
vikraman/ghc | compiler/basicTypes/Literal.hs | bsd-3-clause | char2IntLit (MachChar c) = MachInt (toInteger (ord c)) | 55 | char2IntLit (MachChar c) = MachInt (toInteger (ord c)) | 55 | char2IntLit (MachChar c) = MachInt (toInteger (ord c)) | 55 | false | false | 0 | 9 | 8 | 31 | 14 | 17 | null | null |
mhcurylo/scheme-haskell-tutorial | src/Evaluator.hs | bsd-3-clause | equal badArgList = throwError $ NumArgs 2 badArgList | 52 | equal badArgList = throwError $ NumArgs 2 badArgList | 52 | equal badArgList = throwError $ NumArgs 2 badArgList | 52 | false | false | 0 | 6 | 7 | 18 | 8 | 10 | null | null |
iand675/uri-templater | src/Network/URI/Template/Internal.hs | mit | templateValueIsEmpty :: TemplateValue a -> Bool
templateValueIsEmpty (Single s) = T.null $ toUrlPiece s | 103 | templateValueIsEmpty :: TemplateValue a -> Bool
templateValueIsEmpty (Single s) = T.null $ toUrlPiece s | 103 | templateValueIsEmpty (Single s) = T.null $ toUrlPiece s | 55 | false | true | 0 | 7 | 13 | 36 | 17 | 19 | null | null |
printedheart/Dao | src/Dao/Int.hs | agpl-3.0 | -- | Decode a positive or negative 'Prelude.Integer' using 'vlWord8sToInteger'. The sign of the integer
-- is stored in the final byte in the list of encoded bytes, so the final encoded byte only has 6
-- bits of information, rather than 7 in the case of positive integers.
vlGetInteger :: B.Get Integer
vlGetInteger = fmap (fst . vlWord8sToInteger) vlGatherWord8s | 364 | vlGetInteger :: B.Get Integer
vlGetInteger = fmap (fst . vlWord8sToInteger) vlGatherWord8s | 90 | vlGetInteger = fmap (fst . vlWord8sToInteger) vlGatherWord8s | 60 | true | true | 0 | 7 | 59 | 37 | 18 | 19 | null | null |
haru2036/nagato | Text/Nagato/Train_complement.hs | apache-2.0 | twoMapKeys :: Freqs String -> Freqs String -> [String]
twoMapKeys one two = List.nub $ (keys one) ++ (keys two) | 111 | twoMapKeys :: Freqs String -> Freqs String -> [String]
twoMapKeys one two = List.nub $ (keys one) ++ (keys two) | 111 | twoMapKeys one two = List.nub $ (keys one) ++ (keys two) | 56 | false | true | 0 | 8 | 19 | 55 | 27 | 28 | null | null |
nh2/quickcheck | Test/QuickCheck/Function.hs | bsd-3-clause | showFunction :: (Show a, Show b) => (a :-> b) -> Maybe b -> String
showFunction p md =
"{" ++ concat (intersperse ", " ( [ show x ++ "->" ++ show c
| (x,c) <- table p
]
++ [ "_->" ++ show d
| Just d <- [md]
] )) ++ "}" | 397 | showFunction :: (Show a, Show b) => (a :-> b) -> Maybe b -> String
showFunction p md =
"{" ++ concat (intersperse ", " ( [ show x ++ "->" ++ show c
| (x,c) <- table p
]
++ [ "_->" ++ show d
| Just d <- [md]
] )) ++ "}" | 397 | showFunction p md =
"{" ++ concat (intersperse ", " ( [ show x ++ "->" ++ show c
| (x,c) <- table p
]
++ [ "_->" ++ show d
| Just d <- [md]
] )) ++ "}" | 330 | false | true | 0 | 15 | 233 | 133 | 67 | 66 | null | null |
abakst/liquidhaskell | src/Language/Haskell/Liquid/Types/RefType.hs | bsd-3-clause | cmpLexRef vxs (v, x, g)
= pAnd $ (PAtom Lt (g x) (g v)) : (PAtom Ge (g x) zero)
: [PAtom Eq (f y) (f z) | (y, z, f) <- vxs]
++ [PAtom Ge (f y) zero | (y, _, f) <- vxs]
where zero = ECon $ I 0 | 216 | cmpLexRef vxs (v, x, g)
= pAnd $ (PAtom Lt (g x) (g v)) : (PAtom Ge (g x) zero)
: [PAtom Eq (f y) (f z) | (y, z, f) <- vxs]
++ [PAtom Ge (f y) zero | (y, _, f) <- vxs]
where zero = ECon $ I 0 | 216 | cmpLexRef vxs (v, x, g)
= pAnd $ (PAtom Lt (g x) (g v)) : (PAtom Ge (g x) zero)
: [PAtom Eq (f y) (f z) | (y, z, f) <- vxs]
++ [PAtom Ge (f y) zero | (y, _, f) <- vxs]
where zero = ECon $ I 0 | 216 | false | false | 0 | 12 | 76 | 161 | 84 | 77 | null | null |
rueshyna/gogol | gogol-youtube/gen/Network/Google/YouTube/Types/Product.hs | mpl-2.0 | -- | The channel section\'s title for multiple_playlists and
-- multiple_channels.
cssTitle :: Lens' ChannelSectionSnippet (Maybe Text)
cssTitle = lens _cssTitle (\ s a -> s{_cssTitle = a}) | 189 | cssTitle :: Lens' ChannelSectionSnippet (Maybe Text)
cssTitle = lens _cssTitle (\ s a -> s{_cssTitle = a}) | 106 | cssTitle = lens _cssTitle (\ s a -> s{_cssTitle = a}) | 53 | true | true | 0 | 9 | 27 | 47 | 26 | 21 | null | null |
ricardopenyamari/ir2haskell | clir-parser-haskell-master/app/Main.hs | gpl-2.0 | decodesWith :: Sexp.Position -> SexpG a -> TL.Text -> Either String [a]
decodesWith p g input =
Sexp.parseSexps' p input >>= mapM (parseSexp g) | 145 | decodesWith :: Sexp.Position -> SexpG a -> TL.Text -> Either String [a]
decodesWith p g input =
Sexp.parseSexps' p input >>= mapM (parseSexp g) | 145 | decodesWith p g input =
Sexp.parseSexps' p input >>= mapM (parseSexp g) | 73 | false | true | 0 | 10 | 25 | 70 | 32 | 38 | null | null |
rrnewton/accelerate | Data/Array/Accelerate/Debug/Stats.hs | bsd-3-clause | tickToTag RuleFired{} = 1 | 35 | tickToTag RuleFired{} = 1 | 35 | tickToTag RuleFired{} = 1 | 35 | false | false | 0 | 6 | 13 | 13 | 6 | 7 | null | null |
facebookincubator/duckling | Duckling/Ranking/Classifiers/ES_AR.hs | bsd-3-clause | classifiers :: Classifiers
classifiers
= HashMap.fromList
[("midnight",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.0986122886681098,
likelihoods = HashMap.fromList [("", 0.0)], n = 1},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("Martes",
Classifier{okData =
ClassData{prior = 0.0, unseen = -2.0794415416798357,
likelihoods = HashMap.fromList [("", 0.0)], n = 6},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("<time> timezone",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.6094379124341003,
likelihoods =
HashMap.fromList
[("a las <time-of-day>", -0.6931471805599453),
("hour", -0.6931471805599453)],
n = 1},
koData =
ClassData{prior = -infinity, unseen = -1.0986122886681098,
likelihoods = HashMap.fromList [], n = 0}}),
("integer (numeric)",
Classifier{okData =
ClassData{prior = -0.5659920050746986, unseen = -4.23410650459726,
likelihoods = HashMap.fromList [("", 0.0)], n = 67},
koData =
ClassData{prior = -0.8388589917413389, unseen = -3.970291913552122,
likelihoods = HashMap.fromList [("", 0.0)], n = 51}}),
("the day before yesterday",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.3862943611198906,
likelihoods = HashMap.fromList [("", 0.0)], n = 2},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("hh(:|.|h)mm (time-of-day)",
Classifier{okData =
ClassData{prior = 0.0, unseen = -2.3978952727983707,
likelihoods = HashMap.fromList [("", 0.0)], n = 9},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("<named-month|named-day> past",
Classifier{okData =
ClassData{prior = 0.0, unseen = -2.5649493574615367,
likelihoods =
HashMap.fromList
[("Martes", -1.791759469228055),
("el <time>", -1.3862943611198906),
("Domingo", -1.791759469228055), ("day", -0.8754687373538999)],
n = 4},
koData =
ClassData{prior = -infinity, unseen = -1.6094379124341003,
likelihoods = HashMap.fromList [], n = 0}}),
("Abril",
Classifier{okData =
ClassData{prior = -0.40546510810816444,
unseen = -1.791759469228055,
likelihoods = HashMap.fromList [("", 0.0)], n = 4},
koData =
ClassData{prior = -1.0986122886681098,
unseen = -1.3862943611198906,
likelihoods = HashMap.fromList [("", 0.0)], n = 2}}),
("dd[/-]mm",
Classifier{okData =
ClassData{prior = 0.0, unseen = -2.3025850929940455,
likelihoods = HashMap.fromList [("", 0.0)], n = 8},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("intersect by `de`",
Classifier{okData =
ClassData{prior = -0.19290366612449156,
unseen = -4.890349128221754,
likelihoods =
HashMap.fromList
[("Miercoleseste|en un <cycle>", -4.189654742026425),
("el <day-of-month> (non ordinal)intersect by `de`",
-3.784189633918261),
("daymonth", -1.8382794848629478),
("monthyear", -3.784189633918261),
("el <day-of-month> (non ordinal)Abril", -4.189654742026425),
("Marteseste|en un <cycle>", -4.189654742026425),
("Miercolesel <cycle> (proximo|que viene)", -4.189654742026425),
("el <time>Marzo", -3.784189633918261),
("el <day-of-month> (non ordinal)Septiembre",
-4.189654742026425),
("Miercolesel proximo <cycle> ", -4.189654742026425),
("Luneseste|en un <cycle>", -4.189654742026425),
("dayyear", -2.1102132003465894),
("dd-dd <month>(interval)year", -4.189654742026425),
("el <time>el <cycle> (proximo|que viene)", -4.189654742026425),
("el <day-of-month> (non ordinal)Julio", -4.189654742026425),
("el <time>year", -3.784189633918261),
("Septiembreyear", -4.189654742026425),
("<day-of-month> (ordinal or number) de <named-month>year",
-3.4965075614664802),
("el <time>la <cycle> pasado", -4.189654742026425),
("day of month (1st)Marzo", -3.2733640101522705),
("el <day-of-month> de <named-month>year", -3.784189633918261),
("el <time>este|en un <cycle>", -3.784189633918261),
("Mayoyear", -4.189654742026425),
("<day-of-month> (ordinal or number) de <named-month>year (value by adding three composing numbers together)",
-4.189654742026425),
("two time tokens separated by \",\"year", -3.4965075614664802),
("el <day-of-month> (non ordinal)Febrero", -4.189654742026425),
("two time tokens separated by \",\"intersect by `de`",
-4.189654742026425),
("dayweek", -2.4849066497880004),
("intersect by `de`year", -3.4965075614664802),
("el <day-of-month> (non ordinal)Marzo", -3.4965075614664802),
("Domingola <cycle> pasado", -4.189654742026425),
("two time tokens separated by \",\"Septiembre",
-4.189654742026425),
("el <day-of-month> (non ordinal)Mayo", -3.4965075614664802)],
n = 47},
koData =
ClassData{prior = -1.7404661748405046, unseen = -4.07753744390572,
likelihoods =
HashMap.fromList
[("Mayoyear (value by adding three composing numbers together)",
-3.367295829986474),
("monthyear", -2.268683541318364),
("Julioyear", -3.367295829986474),
("hourmonth", -2.9618307218783095),
("a las <time-of-day>Julio", -3.367295829986474),
("dayyear", -2.6741486494265287),
("<day-of-month> (ordinal or number) de <named-month>year",
-2.6741486494265287),
("Mayoyear", -2.6741486494265287),
("a las <time-of-day>Enero", -3.367295829986474)],
n = 10}}),
("n pasados <cycle>",
Classifier{okData =
ClassData{prior = 0.0, unseen = -2.1972245773362196,
likelihoods =
HashMap.fromList
[("number (0..15)a\241o (grain)", -1.3862943611198906),
("year", -1.3862943611198906),
("number (0..15)mes (grain)", -1.3862943611198906),
("month", -1.3862943611198906)],
n = 2},
koData =
ClassData{prior = -infinity, unseen = -1.6094379124341003,
likelihoods = HashMap.fromList [], n = 0}}),
("<hour-of-day> and half",
Classifier{okData =
ClassData{prior = 0.0, unseen = -2.772588722239781,
likelihoods =
HashMap.fromList
[("a las <time-of-day>", -1.3217558399823195),
("time-of-day (latent)", -1.3217558399823195),
("hour", -0.7621400520468967)],
n = 6},
koData =
ClassData{prior = -infinity, unseen = -1.3862943611198906,
likelihoods = HashMap.fromList [], n = 0}}),
("pasados n <cycle>",
Classifier{okData =
ClassData{prior = 0.0, unseen = -3.2188758248682006,
likelihoods =
HashMap.fromList
[("week", -2.4849066497880004),
("integer (numeric)dia (grain)", -2.4849066497880004),
("integer (numeric)mes (grain)", -2.4849066497880004),
("second", -2.4849066497880004),
("integer (numeric)minutos (grain)", -2.4849066497880004),
("day", -2.4849066497880004),
("integer (numeric)segundo (grain)", -2.4849066497880004),
("year", -2.4849066497880004), ("month", -2.4849066497880004),
("minute", -2.4849066497880004),
("integer (numeric)a\241o (grain)", -2.4849066497880004),
("number (0..15)semana (grain)", -2.4849066497880004)],
n = 6},
koData =
ClassData{prior = -infinity, unseen = -2.5649493574615367,
likelihoods = HashMap.fromList [], n = 0}}),
("<day-of-month> (ordinal or number) <named-month>",
Classifier{okData =
ClassData{prior = 0.0, unseen = -2.0794415416798357,
likelihoods =
HashMap.fromList
[("integer (numeric)Abril", -1.252762968495368),
("integer (numeric)Marzo", -1.252762968495368),
("month", -0.8472978603872037)],
n = 2},
koData =
ClassData{prior = -infinity, unseen = -1.3862943611198906,
likelihoods = HashMap.fromList [], n = 0}}),
("semana (grain)",
Classifier{okData =
ClassData{prior = 0.0, unseen = -3.0910424533583156,
likelihoods = HashMap.fromList [("", 0.0)], n = 20},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("two time tokens separated by \",\"",
Classifier{okData =
ClassData{prior = 0.0, unseen = -3.295836866004329,
likelihoods =
HashMap.fromList
[("Viernesintersect by `de`", -1.466337068793427),
("Lunes<day-of-month> (ordinal or number) de <named-month>",
-2.5649493574615367),
("dayday", -0.8602012652231115),
("Viernesel <day-of-month> de <named-month>",
-2.5649493574615367),
("Viernesel <time>", -2.159484249353372),
("Viernesel <day-of-month> (non ordinal)",
-2.5649493574615367)],
n = 10},
koData =
ClassData{prior = -infinity, unseen = -1.9459101490553135,
likelihoods = HashMap.fromList [], n = 0}}),
("<dim time> de la manana",
Classifier{okData =
ClassData{prior = -0.15415067982725836,
unseen = -2.772588722239781,
likelihoods =
HashMap.fromList
[("a las <time-of-day>", -1.3217558399823195),
("time-of-day (latent)", -1.3217558399823195),
("hour", -0.7621400520468967)],
n = 6},
koData =
ClassData{prior = -1.9459101490553135, unseen = -1.791759469228055,
likelihoods =
HashMap.fromList
[("time-of-day (latent)", -0.916290731874155),
("hour", -0.916290731874155)],
n = 1}}),
("big number 100 to 1K",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.3862943611198906,
likelihoods = HashMap.fromList [("", 0.0)], n = 2},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("del mediod\237a",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.0986122886681098,
likelihoods = HashMap.fromList [("", 0.0)], n = 1},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("D\237a de la Prematuridad Mundial",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.6094379124341003,
likelihoods = HashMap.fromList [("", 0.0)], n = 3},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("Mayo",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.9459101490553135,
likelihoods = HashMap.fromList [("", 0.0)], n = 5},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("Jueves",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.3862943611198906,
likelihoods = HashMap.fromList [("", 0.0)], n = 2},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("<time-of-day> <part-of-day>",
Classifier{okData =
ClassData{prior = -0.13353139262452263,
unseen = -4.3694478524670215,
likelihoods =
HashMap.fromList
[("dayhour", -2.277267285009756),
("Lunesin the <part-of-day>", -3.6635616461296463),
("tomorrowin the <part-of-day>", -3.6635616461296463),
("a las <time-of-day>del mediod\237a", -3.6635616461296463),
("el <day-of-month> de <named-month>in the <part-of-day>",
-3.6635616461296463),
("hourhour", -2.159484249353372),
("a las <time-of-day>in the <part-of-day>",
-2.4107986776342782),
("intersectin the <part-of-day>", -3.6635616461296463),
("minutehour", -1.717651497074333),
("intersect by `de`in the <part-of-day>", -3.6635616461296463),
("<hour-of-day> and halfin the <part-of-day>",
-3.258096538021482),
("<hour-of-day> <integer> (as relative minutes)in the <part-of-day>",
-3.6635616461296463),
("<hour-of-day> and <relative minutes>del mediod\237a",
-3.258096538021482),
("el <time>in the <part-of-day>", -3.6635616461296463),
("<day-of-month> (ordinal or number) de <named-month>in the <part-of-day>",
-3.6635616461296463),
("<hour-of-day> and quarterin the <part-of-day>",
-2.7472709142554916),
("yesterdayin the <part-of-day>", -3.6635616461296463),
("time-of-day (latent)in the <part-of-day>",
-2.7472709142554916)],
n = 28},
koData =
ClassData{prior = -2.0794415416798357,
unseen = -3.4339872044851463,
likelihoods =
HashMap.fromList
[("yearhour", -2.70805020110221),
("year (latent)del mediod\237a", -2.70805020110221),
("monthhour", -2.70805020110221),
("hourhour", -2.3025850929940455),
("Febreroin the <part-of-day>", -2.70805020110221),
("time-of-day (latent)in the <part-of-day>",
-2.3025850929940455)],
n = 4}}),
("de <datetime> - <datetime> (interval)",
Classifier{okData =
ClassData{prior = -infinity, unseen = -1.6094379124341003,
likelihoods = HashMap.fromList [], n = 0},
koData =
ClassData{prior = 0.0, unseen = -2.1972245773362196,
likelihoods =
HashMap.fromList
[("Diciembre<day-of-month> (ordinal or number) de <named-month>",
-1.3862943611198906),
("monthday", -1.3862943611198906),
("Diciembretime-of-day (latent)", -1.3862943611198906),
("monthhour", -1.3862943611198906)],
n = 2}}),
("<time-of-day> horas",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.6094379124341003,
likelihoods =
HashMap.fromList
[("time-of-day (latent)", -0.6931471805599453),
("hour", -0.6931471805599453)],
n = 1},
koData =
ClassData{prior = -infinity, unseen = -1.0986122886681098,
likelihoods = HashMap.fromList [], n = 0}}),
("intersect",
Classifier{okData =
ClassData{prior = -0.20585205420414873,
unseen = -4.663439094112067,
likelihoods =
HashMap.fromList
[("dayhour", -2.0149030205422647),
("Lunesin the <part-of-day>", -3.960813169597578),
("tomorrowin the <part-of-day>", -3.960813169597578),
("el <day-of-month> de <named-month>in the <part-of-day>",
-3.960813169597578),
("D\237a Internacional de las Cooperativasel <time>",
-3.960813169597578),
("hourhour", -3.044522437723423),
("now<hour-of-day> minus quarter (as relative minutes)",
-3.960813169597578),
("dayyear", -3.044522437723423),
("a las <time-of-day>in the <part-of-day>", -2.70805020110221),
("intersectin the <part-of-day>", -3.960813169597578),
("<named-month> <day-of-month>del <year>", -3.960813169597578),
("minutehour", -2.256065077359153),
("intersect by `de`in the <part-of-day>", -3.960813169597578),
("now<hour-of-day> and <relative minutes>", -3.960813169597578),
("<hour-of-day> and halfin the <part-of-day>",
-3.5553480614894135),
("tomorrowa las <time-of-day>", -3.5553480614894135),
("Miercoles<time-of-day> <part-of-day>", -3.960813169597578),
("<hour-of-day> <integer> (as relative minutes)in the <part-of-day>",
-3.960813169597578),
("Miercoles<dim time> de la manana", -3.960813169597578),
("dayminute", -3.044522437723423),
("<named-month> <day-of-month>el <time>", -3.960813169597578),
("Miercolesa las <time-of-day>", -3.960813169597578),
("el <time>in the <part-of-day>", -3.960813169597578),
("Miercolesintersect", -3.960813169597578),
("<day-of-month> (ordinal or number) de <named-month>in the <part-of-day>",
-3.960813169597578),
("nowa las <time-of-day>", -3.5553480614894135),
("D\237a Internacional de las Cooperativasdel <year>",
-3.960813169597578),
("<hour-of-day> and quarterin the <part-of-day>",
-3.044522437723423),
("yesterdayin the <part-of-day>", -3.960813169597578)],
n = 35},
koData =
ClassData{prior = -1.6817585740137264, unseen = -3.951243718581427,
likelihoods =
HashMap.fromList
[("hourday", -3.2386784521643803),
("dayhour", -2.5455312716044354),
("monthhour", -2.833213344056216),
("now<hour-of-day> and <relative minutes>",
-3.2386784521643803),
("Diciembrea las <time-of-day>", -3.2386784521643803),
("dayminute", -2.833213344056216),
("Febreroin the <part-of-day>", -3.2386784521643803),
("<day-of-month> (ordinal or number) de <named-month>a las <time-of-day>",
-3.2386784521643803),
("nowa las <time-of-day>", -2.5455312716044354),
("<time-of-day> am|pm<day-of-month> (ordinal or number) de <named-month>",
-3.2386784521643803)],
n = 8}}),
("Miercoles",
Classifier{okData =
ClassData{prior = 0.0, unseen = -2.3978952727983707,
likelihoods = HashMap.fromList [("", 0.0)], n = 9},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("a las <time-of-day>",
Classifier{okData =
ClassData{prior = -7.320340402329494e-2,
unseen = -5.135798437050262,
likelihoods =
HashMap.fromList
[("<hour-of-day> and half", -3.7436043538031827),
("<time-of-day> horas", -4.436751534363128),
("<hour-of-day> and quarter", -3.520460802488973),
("time-of-day (latent)", -1.4163266482187657),
("<hour-of-day> and <relative minutes>", -3.3381392456950185),
("<time-of-day> am|pm", -2.5649493574615367),
("<hour-of-day> minus <integer> (as relative minutes)",
-4.436751534363128),
("<hour-of-day> minus quarter (as relative minutes)",
-4.0312864262549635),
("hour", -1.3686985992295109), ("minute", -1.4923125551966876),
("<hour-of-day> <integer> (as relative minutes)",
-2.644992065135073)],
n = 79},
koData =
ClassData{prior = -2.6508917872622613,
unseen = -3.1780538303479458,
likelihoods =
HashMap.fromList
[("time-of-day (latent)", -1.5260563034950494),
("<hour-of-day> and <relative minutes>", -2.03688192726104),
("hour", -1.5260563034950494), ("minute", -2.03688192726104)],
n = 6}}),
("minutos (grain)",
Classifier{okData =
ClassData{prior = 0.0, unseen = -2.1972245773362196,
likelihoods = HashMap.fromList [("", 0.0)], n = 7},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("year (latent)",
Classifier{okData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0},
koData =
ClassData{prior = 0.0, unseen = -1.0986122886681098,
likelihoods = HashMap.fromList [("number (20..90)", 0.0)],
n = 1}}),
("Viernes",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.791759469228055,
likelihoods = HashMap.fromList [("", 0.0)], n = 4},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("el <cycle> (proximo|que viene)",
Classifier{okData =
ClassData{prior = 0.0, unseen = -2.70805020110221,
likelihoods =
HashMap.fromList
[("week", -1.540445040947149),
("semana (grain)", -1.540445040947149),
("mes (grain)", -1.9459101490553135),
("year", -1.9459101490553135),
("a\241o (grain)", -1.9459101490553135),
("month", -1.9459101490553135)],
n = 4},
koData =
ClassData{prior = -infinity, unseen = -1.9459101490553135,
likelihoods = HashMap.fromList [], n = 0}}),
("yesterday",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.3862943611198906,
likelihoods = HashMap.fromList [("", 0.0)], n = 2},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("<time-of-day> de la tarde",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.6094379124341003,
likelihoods =
HashMap.fromList
[("time-of-day (latent)number (0..15)", -0.6931471805599453),
("hour", -0.6931471805599453)],
n = 1},
koData =
ClassData{prior = -infinity, unseen = -1.0986122886681098,
likelihoods = HashMap.fromList [], n = 0}}),
("<hour-of-day> and quarter",
Classifier{okData =
ClassData{prior = 0.0, unseen = -3.0910424533583156,
likelihoods =
HashMap.fromList
[("a las <time-of-day>", -1.4350845252893227),
("time-of-day (latent)", -1.252762968495368),
("hour", -0.7419373447293773)],
n = 9},
koData =
ClassData{prior = -infinity, unseen = -1.3862943611198906,
likelihoods = HashMap.fromList [], n = 0}}),
("dentro de <duration>",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.6094379124341003,
likelihoods =
HashMap.fromList
[("<integer> <unit-of-duration>", -0.6931471805599453),
("hour", -0.6931471805599453)],
n = 1},
koData =
ClassData{prior = -infinity, unseen = -1.0986122886681098,
likelihoods = HashMap.fromList [], n = 0}}),
("hace <duration>",
Classifier{okData =
ClassData{prior = 0.0, unseen = -2.639057329615259,
likelihoods =
HashMap.fromList
[("week", -1.8718021769015913), ("year", -1.8718021769015913),
("<integer> <unit-of-duration>", -0.9555114450274363),
("hour", -1.8718021769015913), ("month", -1.8718021769015913)],
n = 4},
koData =
ClassData{prior = -infinity, unseen = -1.791759469228055,
likelihoods = HashMap.fromList [], n = 0}}),
("el <day-of-month> de <named-month>",
Classifier{okData =
ClassData{prior = 0.0, unseen = -3.4011973816621555,
likelihoods =
HashMap.fromList
[("number (0..15)Marzo", -2.6741486494265287),
("integer (numeric)Abril", -2.6741486494265287),
("number (0..15)Mayo", -2.268683541318364),
("integer (numeric)Marzo", -2.268683541318364),
("integer (numeric)Febrero", -2.6741486494265287),
("integer (numeric)Septiembre", -2.6741486494265287),
("month", -0.9694005571881036),
("integer (numeric)Mayo", -2.6741486494265287),
("integer (numeric)Julio", -2.6741486494265287)],
n = 10},
koData =
ClassData{prior = -infinity, unseen = -2.3025850929940455,
likelihoods = HashMap.fromList [], n = 0}}),
("D\237a Mundial de la Lengua \193rabe",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.3862943611198906,
likelihoods = HashMap.fromList [("", 0.0)], n = 2},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("D\237a de los Inocentes de Abril",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.791759469228055,
likelihoods = HashMap.fromList [("", 0.0)], n = 4},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("dia <day-of-month> (non ordinal)",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.6094379124341003,
likelihoods = HashMap.fromList [("number (0..15)", 0.0)], n = 3},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("el <time>",
Classifier{okData =
ClassData{prior = -2.5317807984289897e-2,
unseen = -4.543294782270004,
likelihoods =
HashMap.fromList
[("Martes", -3.4339872044851463),
("<named-month|named-day> past", -3.4339872044851463),
("dd[/-]mm", -3.146305132033365),
("intersect by `de`", -2.3353749158170367),
("<time-of-day> <part-of-day>", -3.8394523125933104),
("intersect", -3.8394523125933104),
("Miercoles", -3.4339872044851463),
("<day-of-month> (ordinal or number) de <named-month>",
-2.0476928433652555),
("Domingo", -3.4339872044851463),
("Lunes", -3.8394523125933104), ("day", -0.9490805546971459),
("year", -3.4339872044851463),
("day of month (1st)", -3.4339872044851463),
("<named-month|named-day> next", -3.8394523125933104),
("hour", -3.4339872044851463),
("this|next <day-of-week>", -3.8394523125933104)],
n = 39},
koData =
ClassData{prior = -3.6888794541139363, unseen = -2.995732273553991,
likelihoods =
HashMap.fromList
[("noon", -2.2512917986064953), ("hour", -2.2512917986064953)],
n = 1}}),
("Septiembre",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.0986122886681098,
likelihoods = HashMap.fromList [("", 0.0)], n = 1},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("<thousands> 0..999",
Classifier{okData =
ClassData{prior = -0.6931471805599453,
unseen = -1.6094379124341003,
likelihoods =
HashMap.fromList
[("1K or 1M in multipliable form<hundreds> 0..99",
-0.2876820724517809)],
n = 2},
koData =
ClassData{prior = -0.6931471805599453,
unseen = -1.6094379124341003,
likelihoods =
HashMap.fromList
[("1K or 1M in multipliable formbig number 100 to 1K",
-0.2876820724517809)],
n = 2}}),
("<day-of-month> (ordinal or number) de <named-month>",
Classifier{okData =
ClassData{prior = -8.338160893905101e-2,
unseen = -4.07753744390572,
likelihoods =
HashMap.fromList
[("ordinals (primero..10)Marzo", -2.9618307218783095),
("number (0..15)Marzo", -2.9618307218783095),
("integer (numeric)Abril", -2.9618307218783095),
("integer (numeric)Diciembre", -3.367295829986474),
("number (0..15)Mayo", -2.6741486494265287),
("integer (numeric)Enero", -3.367295829986474),
("integer (numeric)Marzo", -2.451005098112319),
("integer (numeric)Febrero", -2.268683541318364),
("integer (numeric)Septiembre", -3.367295829986474),
("month", -0.8823891801984737),
("integer (numeric)Mayo", -3.367295829986474),
("integer (numeric)Julio", -3.367295829986474)],
n = 23},
koData =
ClassData{prior = -2.5257286443082556, unseen = -2.833213344056216,
likelihoods =
HashMap.fromList
[("month", -1.6739764335716716),
("integer (numeric)Julio", -1.6739764335716716)],
n = 2}}),
("now",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.791759469228055,
likelihoods = HashMap.fromList [("", 0.0)], n = 4},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("ordinals (primero..10)",
Classifier{okData =
ClassData{prior = -1.791759469228055, unseen = -1.3862943611198906,
likelihoods = HashMap.fromList [("", 0.0)], n = 2},
koData =
ClassData{prior = -0.1823215567939546,
unseen = -2.4849066497880004,
likelihoods = HashMap.fromList [("", 0.0)], n = 10}}),
("invierno",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.0986122886681098,
likelihoods = HashMap.fromList [("", 0.0)], n = 1},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("this <part-of-day>",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.6094379124341003,
likelihoods =
HashMap.fromList
[("hour", -0.6931471805599453),
("evening", -0.6931471805599453)],
n = 1},
koData =
ClassData{prior = -infinity, unseen = -1.0986122886681098,
likelihoods = HashMap.fromList [], n = 0}}),
("number (0..15)",
Classifier{okData =
ClassData{prior = -0.13858616328614667,
unseen = -4.330733340286331,
likelihoods = HashMap.fromList [("", 0.0)], n = 74},
koData =
ClassData{prior = -2.044755983691946, unseen = -2.5649493574615367,
likelihoods = HashMap.fromList [("", 0.0)], n = 11}}),
("D\237a Internacional de las Cooperativas",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.0986122886681098,
likelihoods = HashMap.fromList [("", 0.0)], n = 1},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("Domingo",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.6094379124341003,
likelihoods = HashMap.fromList [("", 0.0)], n = 3},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("este|en un <cycle>",
Classifier{okData =
ClassData{prior = 0.0, unseen = -2.70805020110221,
likelihoods =
HashMap.fromList
[("week", -1.0296194171811581),
("semana (grain)", -1.0296194171811581),
("year", -1.9459101490553135),
("a\241o (grain)", -1.9459101490553135)],
n = 5},
koData =
ClassData{prior = -infinity, unseen = -1.6094379124341003,
likelihoods = HashMap.fromList [], n = 0}}),
("numbers prefix with -, negative or minus",
Classifier{okData =
ClassData{prior = -infinity, unseen = -1.0986122886681098,
likelihoods = HashMap.fromList [], n = 0},
koData =
ClassData{prior = 0.0, unseen = -2.4849066497880004,
likelihoods =
HashMap.fromList
[("integer (numeric)", -0.2006706954621511),
("number (0..15)", -1.7047480922384253)],
n = 9}}),
("Lunes",
Classifier{okData =
ClassData{prior = 0.0, unseen = -2.1972245773362196,
likelihoods = HashMap.fromList [("", 0.0)], n = 7},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("dd-dd <month>(interval)",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.9459101490553135,
likelihoods =
HashMap.fromList
[("Julio", -0.6931471805599453), ("month", -0.6931471805599453)],
n = 2},
koData =
ClassData{prior = -infinity, unseen = -1.0986122886681098,
likelihoods = HashMap.fromList [], n = 0}}),
("tomorrow",
Classifier{okData =
ClassData{prior = -0.12188981760903689, unseen = -4.02535169073515,
likelihoods = HashMap.fromList [("", 0.0)], n = 54},
koData =
ClassData{prior = -2.164963715117998, unseen = -2.1972245773362196,
likelihoods = HashMap.fromList [("", 0.0)], n = 7}}),
("mes (grain)",
Classifier{okData =
ClassData{prior = 0.0, unseen = -2.4849066497880004,
likelihoods = HashMap.fromList [("", 0.0)], n = 10},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("verano",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.0986122886681098,
likelihoods = HashMap.fromList [("", 0.0)], n = 1},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("number (20..90)",
Classifier{okData =
ClassData{prior = 0.0, unseen = -2.0794415416798357,
likelihoods = HashMap.fromList [("", 0.0)], n = 6},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("<day-of-week> <day-of-month>",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.6094379124341003,
likelihoods =
HashMap.fromList
[("day", -0.6931471805599453),
("Juevesinteger (numeric)", -0.6931471805599453)],
n = 1},
koData =
ClassData{prior = -infinity, unseen = -1.0986122886681098,
likelihoods = HashMap.fromList [], n = 0}}),
("fractional number",
Classifier{okData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0},
koData =
ClassData{prior = 0.0, unseen = -2.0794415416798357,
likelihoods = HashMap.fromList [("", 0.0)], n = 6}}),
("1K or 1M in multipliable form",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.3862943611198906,
likelihoods = HashMap.fromList [("", 0.0)], n = 2},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("afternoon",
Classifier{okData =
ClassData{prior = -0.2876820724517809,
unseen = -2.0794415416798357,
likelihoods = HashMap.fromList [("", 0.0)], n = 6},
koData =
ClassData{prior = -1.3862943611198906,
unseen = -1.3862943611198906,
likelihoods = HashMap.fromList [("", 0.0)], n = 2}}),
("time-of-day (latent)",
Classifier{okData =
ClassData{prior = -0.6592456288842639, unseen = -3.891820298110627,
likelihoods =
HashMap.fromList
[("integer (numeric)", -1.3062516534463542),
("number (0..15)", -0.3448404862917295)],
n = 45},
koData =
ClassData{prior = -0.7282385003712154, unseen = -3.828641396489095,
likelihoods =
HashMap.fromList
[("integer (numeric)", -1.5040773967762742),
("number (0..15)", -0.7156200364120039),
("integer (0-9) with two digits", -1.241713132308783)],
n = 42}}),
("<hour-of-day> and <relative minutes>",
Classifier{okData =
ClassData{prior = -0.3364722366212129, unseen = -3.332204510175204,
likelihoods =
HashMap.fromList
[("time-of-day (latent)number (21..29 31..39 41..49 51..59 61..69 71..79 81..89 91..99)",
-2.1972245773362196),
("time-of-day (latent)number (0..15)", -2.6026896854443837),
("a las <time-of-day>number (20..90)", -2.1972245773362196),
("a las <time-of-day>number (21..29 31..39 41..49 51..59 61..69 71..79 81..89 91..99)",
-2.1972245773362196),
("hour", -0.8979415932059586),
("a las <time-of-day>number (0..15)", -2.6026896854443837),
("time-of-day (latent)number (20..90)", -2.1972245773362196)],
n = 10},
koData =
ClassData{prior = -1.252762968495368, unseen = -2.772588722239781,
likelihoods =
HashMap.fromList
[("a las <time-of-day>number (20..90)", -1.6094379124341003),
("hour", -1.0986122886681098),
("time-of-day (latent)number (20..90)", -1.6094379124341003)],
n = 4}}),
("year",
Classifier{okData =
ClassData{prior = -0.8266785731844679,
unseen = -2.3978952727983707,
likelihoods =
HashMap.fromList
[("integer (numeric)", -0.5108256237659907),
("<thousands> 0..999", -1.2039728043259361)],
n = 7},
koData =
ClassData{prior = -0.5753641449035618,
unseen = -2.5649493574615367,
likelihoods =
HashMap.fromList
[("integer (numeric)", -0.6931471805599453),
("<thousands> 0..999", -1.3862943611198906),
("1K or 1M in multipliable form", -1.3862943611198906)],
n = 9}}),
("en <duration>",
Classifier{okData =
ClassData{prior = 0.0, unseen = -3.6635616461296463,
likelihoods =
HashMap.fromList
[("week", -2.9444389791664407), ("second", -2.9444389791664407),
("day", -2.538973871058276), ("year", -2.538973871058276),
("<integer> <unit-of-duration>", -0.8649974374866046),
("hour", -2.2512917986064953), ("month", -2.9444389791664407),
("minute", -1.845826690498331)],
n = 15},
koData =
ClassData{prior = -infinity, unseen = -2.1972245773362196,
likelihoods = HashMap.fromList [], n = 0}}),
("n <cycle> (proximo|que viene)",
Classifier{okData =
ClassData{prior = 0.0, unseen = -2.5649493574615367,
likelihoods =
HashMap.fromList
[("week", -1.791759469228055),
("integer (numeric)semana (grain)", -1.791759469228055),
("year", -1.791759469228055),
("number (0..15)mes (grain)", -1.791759469228055),
("month", -1.791759469228055),
("integer (numeric)a\241o (grain)", -1.791759469228055)],
n = 3},
koData =
ClassData{prior = -infinity, unseen = -1.9459101490553135,
likelihoods = HashMap.fromList [], n = 0}}),
("<integer> <unit-of-duration>",
Classifier{okData =
ClassData{prior = -0.587786664902119, unseen = -4.143134726391533,
likelihoods =
HashMap.fromList
[("week", -3.028522096376982),
("integer (numeric)hora (grain)", -3.4339872044851463),
("integer (numeric)dia (grain)", -3.4339872044851463),
("number (0..15)segundo (grain)", -3.4339872044851463),
("second", -3.4339872044851463),
("number (0..15)a\241o (grain)", -3.028522096376982),
("integer (numeric)minutos (grain)", -2.740840023925201),
("day", -3.028522096376982), ("year", -2.740840023925201),
("number (0..15)mes (grain)", -3.028522096376982),
("number (0..15)hora (grain)", -2.740840023925201),
("hour", -2.3353749158170367), ("month", -3.028522096376982),
("number (0..15)dia (grain)", -3.4339872044851463),
("number (0..15)minutos (grain)", -3.028522096376982),
("number (16..19 21..29)hora (grain)", -3.4339872044851463),
("minute", -2.3353749158170367),
("integer (numeric)a\241o (grain)", -3.4339872044851463),
("number (0..15)semana (grain)", -3.028522096376982)],
n = 20},
koData =
ClassData{prior = -0.8109302162163288, unseen = -4.007333185232471,
likelihoods =
HashMap.fromList
[("week", -2.890371757896165),
("integer (numeric)hora (grain)", -2.890371757896165),
("integer (numeric)dia (grain)", -2.890371757896165),
("integer (numeric)mes (grain)", -3.295836866004329),
("second", -2.890371757896165),
("number (0..15)a\241o (grain)", -3.295836866004329),
("integer (numeric)semana (grain)", -3.295836866004329),
("integer (numeric)minutos (grain)", -2.890371757896165),
("day", -2.890371757896165),
("integer (numeric)segundo (grain)", -2.890371757896165),
("year", -2.6026896854443837),
("number (0..15)mes (grain)", -2.890371757896165),
("hour", -2.890371757896165), ("month", -2.6026896854443837),
("minute", -2.890371757896165),
("integer (numeric)a\241o (grain)", -2.890371757896165),
("number (0..15)semana (grain)", -3.295836866004329)],
n = 16}}),
("proximas n <cycle>",
Classifier{okData =
ClassData{prior = 0.0, unseen = -3.2188758248682006,
likelihoods =
HashMap.fromList
[("integer (numeric)hora (grain)", -2.4849066497880004),
("integer (numeric)dia (grain)", -2.4849066497880004),
("second", -2.4849066497880004),
("number (0..15)a\241o (grain)", -2.4849066497880004),
("integer (numeric)minutos (grain)", -2.4849066497880004),
("day", -2.4849066497880004),
("integer (numeric)segundo (grain)", -2.4849066497880004),
("year", -2.4849066497880004),
("number (0..15)mes (grain)", -2.4849066497880004),
("hour", -2.4849066497880004), ("month", -2.4849066497880004),
("minute", -2.4849066497880004)],
n = 6},
koData =
ClassData{prior = -infinity, unseen = -2.5649493574615367,
likelihoods = HashMap.fromList [], n = 0}}),
("<time-of-day> am|pm",
Classifier{okData =
ClassData{prior = -0.7069405026922811, unseen = -4.356708826689592,
likelihoods =
HashMap.fromList
[("a las <time-of-day>", -1.7788560643921472),
("time-of-day (latent)", -3.6506582412937383),
("hour", -3.245193133185574), ("minute", -0.7884573603642702),
("<hour-of-day> <integer> (as relative minutes)",
-1.1657515915057381)],
n = 36},
koData =
ClassData{prior = -0.6795415285041666, unseen = -4.382026634673881,
likelihoods =
HashMap.fromList
[("time-of-day (latent)", -1.1113513144455396),
("hour", -1.1113513144455396), ("minute", -1.8044984950054848),
("<hour-of-day> <integer> (as relative minutes)",
-1.8044984950054848)],
n = 37}}),
("n proximas <cycle>",
Classifier{okData =
ClassData{prior = 0.0, unseen = -2.5649493574615367,
likelihoods =
HashMap.fromList
[("week", -1.791759469228055),
("integer (numeric)mes (grain)", -1.791759469228055),
("integer (numeric)semana (grain)", -1.791759469228055),
("year", -1.791759469228055), ("month", -1.791759469228055),
("integer (numeric)a\241o (grain)", -1.791759469228055)],
n = 3},
koData =
ClassData{prior = -infinity, unseen = -1.9459101490553135,
likelihoods = HashMap.fromList [], n = 0}}),
("ano nuevo",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.3862943611198906,
likelihoods = HashMap.fromList [("", 0.0)], n = 2},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("la <cycle> pasado",
Classifier{okData =
ClassData{prior = 0.0, unseen = -2.3978952727983707,
likelihoods =
HashMap.fromList
[("week", -1.2039728043259361),
("semana (grain)", -1.2039728043259361),
("year", -1.6094379124341003),
("a\241o (grain)", -1.6094379124341003)],
n = 3},
koData =
ClassData{prior = -infinity, unseen = -1.6094379124341003,
likelihoods = HashMap.fromList [], n = 0}}),
("la pasado <cycle>",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.6094379124341003,
likelihoods =
HashMap.fromList
[("mes (grain)", -0.6931471805599453),
("month", -0.6931471805599453)],
n = 1},
koData =
ClassData{prior = -infinity, unseen = -1.0986122886681098,
likelihoods = HashMap.fromList [], n = 0}}),
("number (21..29 31..39 41..49 51..59 61..69 71..79 81..89 91..99)",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.3862943611198906,
likelihoods =
HashMap.fromList [("number (20..90)number (0..15)", 0.0)],
n = 2},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("day of month (1st)",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.791759469228055,
likelihoods = HashMap.fromList [("", 0.0)], n = 4},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("Sabado",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.0986122886681098,
likelihoods = HashMap.fromList [("", 0.0)], n = 1},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("Diciembre",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.0986122886681098,
likelihoods = HashMap.fromList [("", 0.0)], n = 1},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("D\237a de la Cero Discriminaci\243n",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.3862943611198906,
likelihoods = HashMap.fromList [("", 0.0)], n = 2},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("a\241o (grain)",
Classifier{okData =
ClassData{prior = 0.0, unseen = -2.639057329615259,
likelihoods = HashMap.fromList [("", 0.0)], n = 12},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("Julio",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.6094379124341003,
likelihoods = HashMap.fromList [("", 0.0)], n = 3},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("<hundreds> 0..99",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.3862943611198906,
likelihoods =
HashMap.fromList [("big number 100 to 1Knumber (20..90)", 0.0)],
n = 2},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("<hour-of-day> minus <integer> (as relative minutes)",
Classifier{okData =
ClassData{prior = 0.0, unseen = -2.0794415416798357,
likelihoods =
HashMap.fromList
[("time-of-day (latent)number (0..15)", -1.252762968495368),
("hour", -0.8472978603872037),
("a las <time-of-day>number (0..15)", -1.252762968495368)],
n = 2},
koData =
ClassData{prior = -infinity, unseen = -1.3862943611198906,
likelihoods = HashMap.fromList [], n = 0}}),
("<named-month|named-day> next",
Classifier{okData =
ClassData{prior = 0.0, unseen = -2.3978952727983707,
likelihoods =
HashMap.fromList
[("Martes", -1.6094379124341003),
("Miercoles", -1.6094379124341003),
("el <time>", -1.6094379124341003),
("day", -0.916290731874155)],
n = 3},
koData =
ClassData{prior = -infinity, unseen = -1.6094379124341003,
likelihoods = HashMap.fromList [], n = 0}}),
("number (16..19 21..29)",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.0986122886681098,
likelihoods = HashMap.fromList [("", 0.0)], n = 1},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("<dim time> de la tarde",
Classifier{okData =
ClassData{prior = -5.406722127027582e-2,
unseen = -3.784189633918261,
likelihoods =
HashMap.fromList
[("<hour-of-day> and half", -2.662587827025453),
("a las <time-of-day>", -1.6817585740137264),
("<hour-of-day> and quarter", -2.151762203259462),
("time-of-day (latent)", -2.151762203259462),
("hour", -1.563975538357343), ("minute", -1.363304842895192),
("<hour-of-day> <integer> (as relative minutes)",
-3.068052935133617)],
n = 18},
koData =
ClassData{prior = -2.9444389791664407,
unseen = -2.3025850929940455,
likelihoods =
HashMap.fromList
[("time-of-day (latent)", -1.5040773967762742),
("hour", -1.5040773967762742)],
n = 1}}),
("el proximo <cycle> ",
Classifier{okData =
ClassData{prior = 0.0, unseen = -2.70805020110221,
likelihoods =
HashMap.fromList
[("week", -1.540445040947149),
("semana (grain)", -1.540445040947149),
("mes (grain)", -1.9459101490553135),
("year", -1.9459101490553135),
("a\241o (grain)", -1.9459101490553135),
("month", -1.9459101490553135)],
n = 4},
koData =
ClassData{prior = -infinity, unseen = -1.9459101490553135,
likelihoods = HashMap.fromList [], n = 0}}),
("<hour-of-day> minus quarter (as relative minutes)",
Classifier{okData =
ClassData{prior = 0.0, unseen = -2.4849066497880004,
likelihoods =
HashMap.fromList
[("a las <time-of-day>", -1.2992829841302609),
("time-of-day (latent)", -1.2992829841302609),
("hour", -0.7884573603642702)],
n = 4},
koData =
ClassData{prior = -infinity, unseen = -1.3862943611198906,
likelihoods = HashMap.fromList [], n = 0}}),
("the day after tomorrow",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.0986122886681098,
likelihoods = HashMap.fromList [("", 0.0)], n = 1},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("del <year>",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.3862943611198906,
likelihoods = HashMap.fromList [("integer (numeric)", 0.0)],
n = 2},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("dd[/-.]mm[/-.]yyyy",
Classifier{okData =
ClassData{prior = 0.0, unseen = -2.0794415416798357,
likelihoods = HashMap.fromList [("", 0.0)], n = 6},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("noon",
Classifier{okData =
ClassData{prior = -0.2876820724517809,
unseen = -1.6094379124341003,
likelihoods = HashMap.fromList [("", 0.0)], n = 3},
koData =
ClassData{prior = -1.3862943611198906,
unseen = -1.0986122886681098,
likelihoods = HashMap.fromList [("", 0.0)], n = 1}}),
("evening",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.791759469228055,
likelihoods = HashMap.fromList [("", 0.0)], n = 4},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("Febrero",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.9459101490553135,
likelihoods = HashMap.fromList [("", 0.0)], n = 5},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("next week",
Classifier{okData =
ClassData{prior = -0.40546510810816444,
unseen = -1.9459101490553135,
likelihoods =
HashMap.fromList
[("week", -0.6931471805599453),
("semana (grain)", -0.6931471805599453)],
n = 2},
koData =
ClassData{prior = -1.0986122886681098,
unseen = -1.6094379124341003,
likelihoods =
HashMap.fromList
[("week", -0.6931471805599453),
("semana (grain)", -0.6931471805599453)],
n = 1}}),
("<datetime> - <datetime> (interval)",
Classifier{okData =
ClassData{prior = -0.916290731874155, unseen = -2.5649493574615367,
likelihoods =
HashMap.fromList
[("minuteminute", -1.791759469228055),
("dayday", -1.791759469228055),
("hh(:|.|h)mm (time-of-day)hh(:|.|h)mm (time-of-day)",
-1.791759469228055),
("<day-of-month> (ordinal or number) de <named-month><day-of-month> (ordinal or number) de <named-month>",
-1.791759469228055)],
n = 2},
koData =
ClassData{prior = -0.5108256237659907, unseen = -2.70805020110221,
likelihoods =
HashMap.fromList
[("Diciembre<day-of-month> (ordinal or number) de <named-month>",
-1.9459101490553135),
("monthday", -1.9459101490553135),
("dayyear", -1.540445040947149),
("dd[/-]mmyear", -1.540445040947149)],
n = 3}}),
("Enero",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.0986122886681098,
likelihoods = HashMap.fromList [("", 0.0)], n = 1},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("el <day-of-month> (non ordinal)",
Classifier{okData =
ClassData{prior = -6.453852113757118e-2,
unseen = -2.890371757896165,
likelihoods =
HashMap.fromList
[("integer (numeric)", -0.2682639865946794),
("number (0..15)", -1.4469189829363254)],
n = 15},
koData =
ClassData{prior = -2.772588722239781, unseen = -1.3862943611198906,
likelihoods =
HashMap.fromList [("integer (numeric)", -0.40546510810816444)],
n = 1}}),
("segundo (grain)",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.6094379124341003,
likelihoods = HashMap.fromList [("", 0.0)], n = 3},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("next week (alt)",
Classifier{okData =
ClassData{prior = -0.3364722366212129,
unseen = -2.5649493574615367,
likelihoods =
HashMap.fromList
[("week", -0.6931471805599453),
("semana (grain)", -0.6931471805599453)],
n = 5},
koData =
ClassData{prior = -1.252762968495368, unseen = -1.9459101490553135,
likelihoods =
HashMap.fromList
[("week", -0.6931471805599453),
("semana (grain)", -0.6931471805599453)],
n = 2}}),
("Marzo",
Classifier{okData =
ClassData{prior = 0.0, unseen = -2.4849066497880004,
likelihoods = HashMap.fromList [("", 0.0)], n = 10},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("<named-month> <day-of-month>",
Classifier{okData =
ClassData{prior = 0.0, unseen = -2.3978952727983707,
likelihoods =
HashMap.fromList
[("Marzointeger (numeric)", -1.6094379124341003),
("Abrilinteger (numeric)", -1.6094379124341003),
("month", -0.916290731874155),
("Mayointeger (numeric)", -1.6094379124341003)],
n = 3},
koData =
ClassData{prior = -infinity, unseen = -1.6094379124341003,
likelihoods = HashMap.fromList [], n = 0}}),
("dia (grain)",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.791759469228055,
likelihoods = HashMap.fromList [("", 0.0)], n = 4},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("in the <part-of-day>",
Classifier{okData =
ClassData{prior = -0.2682639865946794,
unseen = -3.4339872044851463,
likelihoods =
HashMap.fromList
[("afternoon", -1.455287232606842),
("hour", -0.7621400520468967), ("evening", -2.0149030205422647),
("morning", -1.791759469228055)],
n = 13},
koData =
ClassData{prior = -1.4469189829363254,
unseen = -2.5649493574615367,
likelihoods =
HashMap.fromList
[("afternoon", -1.3862943611198906),
("hour", -0.8754687373538999),
("morning", -1.3862943611198906)],
n = 4}}),
("this|next <day-of-week>",
Classifier{okData =
ClassData{prior = 0.0, unseen = -2.3025850929940455,
likelihoods =
HashMap.fromList
[("Viernes", -1.0986122886681098),
("Lunes", -1.5040773967762742), ("day", -0.8109302162163288)],
n = 3},
koData =
ClassData{prior = -infinity, unseen = -1.3862943611198906,
likelihoods = HashMap.fromList [], n = 0}}),
("morning",
Classifier{okData =
ClassData{prior = -0.40546510810816444,
unseen = -1.791759469228055,
likelihoods = HashMap.fromList [("", 0.0)], n = 4},
koData =
ClassData{prior = -1.0986122886681098,
unseen = -1.3862943611198906,
likelihoods = HashMap.fromList [("", 0.0)], n = 2}}),
("week-end",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.3862943611198906,
likelihoods = HashMap.fromList [("", 0.0)], n = 2},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("Nochevieja",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.0986122886681098,
likelihoods = HashMap.fromList [("", 0.0)], n = 1},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("year (value by adding three composing numbers together)",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.3862943611198906,
likelihoods =
HashMap.fromList [("big number 100 to 1Knumber (20..90)", 0.0)],
n = 2},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("hora (grain)",
Classifier{okData =
ClassData{prior = -0.15415067982725836,
unseen = -2.0794415416798357,
likelihoods = HashMap.fromList [("", 0.0)], n = 6},
koData =
ClassData{prior = -1.9459101490553135,
unseen = -1.0986122886681098,
likelihoods = HashMap.fromList [("", 0.0)], n = 1}}),
("right now",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.791759469228055,
likelihoods = HashMap.fromList [("", 0.0)], n = 4},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("Navidad",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.3862943611198906,
likelihoods = HashMap.fromList [("", 0.0)], n = 2},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("<hour-of-day> <integer> (as relative minutes)",
Classifier{okData =
ClassData{prior = -0.40546510810816444,
unseen = -3.9889840465642745,
likelihoods =
HashMap.fromList
[("a las <time-of-day>integer (0-9) with two digits",
-1.4853852637641216),
("time-of-day (latent)integer (0-9) with two digits",
-1.405342556090585),
("time-of-day (latent)number (0..15)", -3.2771447329921766),
("hour", -0.7514160886839211)],
n = 24},
koData =
ClassData{prior = -1.0986122886681098,
unseen = -3.4011973816621555,
likelihoods =
HashMap.fromList
[("time-of-day (latent)integer (numeric)", -1.9810014688665833),
("time-of-day (latent)number (0..15)", -1.0647107369924282),
("hour", -0.8023464725249373)],
n = 12}}),
("integer (0-9) with two digits",
Classifier{okData =
ClassData{prior = 0.0, unseen = -2.70805020110221,
likelihoods =
HashMap.fromList
[("integer (numeric)", -1.252762968495368),
("number (0..15)", -0.3364722366212129)],
n = 12},
koData =
ClassData{prior = -infinity, unseen = -1.0986122886681098,
likelihoods = HashMap.fromList [], n = 0}}),
("ce <time>",
Classifier{okData =
ClassData{prior = 0.0, unseen = -2.833213344056216,
likelihoods =
HashMap.fromList
[("invierno", -2.0794415416798357),
("Lunes", -2.0794415416798357), ("verano", -2.0794415416798357),
("day", -1.3862943611198906), ("hour", -1.6739764335716716),
("week-end", -1.6739764335716716)],
n = 5},
koData =
ClassData{prior = -infinity, unseen = -1.9459101490553135,
likelihoods = HashMap.fromList [], n = 0}})] | 88,651 | classifiers :: Classifiers
classifiers
= HashMap.fromList
[("midnight",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.0986122886681098,
likelihoods = HashMap.fromList [("", 0.0)], n = 1},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("Martes",
Classifier{okData =
ClassData{prior = 0.0, unseen = -2.0794415416798357,
likelihoods = HashMap.fromList [("", 0.0)], n = 6},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("<time> timezone",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.6094379124341003,
likelihoods =
HashMap.fromList
[("a las <time-of-day>", -0.6931471805599453),
("hour", -0.6931471805599453)],
n = 1},
koData =
ClassData{prior = -infinity, unseen = -1.0986122886681098,
likelihoods = HashMap.fromList [], n = 0}}),
("integer (numeric)",
Classifier{okData =
ClassData{prior = -0.5659920050746986, unseen = -4.23410650459726,
likelihoods = HashMap.fromList [("", 0.0)], n = 67},
koData =
ClassData{prior = -0.8388589917413389, unseen = -3.970291913552122,
likelihoods = HashMap.fromList [("", 0.0)], n = 51}}),
("the day before yesterday",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.3862943611198906,
likelihoods = HashMap.fromList [("", 0.0)], n = 2},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("hh(:|.|h)mm (time-of-day)",
Classifier{okData =
ClassData{prior = 0.0, unseen = -2.3978952727983707,
likelihoods = HashMap.fromList [("", 0.0)], n = 9},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("<named-month|named-day> past",
Classifier{okData =
ClassData{prior = 0.0, unseen = -2.5649493574615367,
likelihoods =
HashMap.fromList
[("Martes", -1.791759469228055),
("el <time>", -1.3862943611198906),
("Domingo", -1.791759469228055), ("day", -0.8754687373538999)],
n = 4},
koData =
ClassData{prior = -infinity, unseen = -1.6094379124341003,
likelihoods = HashMap.fromList [], n = 0}}),
("Abril",
Classifier{okData =
ClassData{prior = -0.40546510810816444,
unseen = -1.791759469228055,
likelihoods = HashMap.fromList [("", 0.0)], n = 4},
koData =
ClassData{prior = -1.0986122886681098,
unseen = -1.3862943611198906,
likelihoods = HashMap.fromList [("", 0.0)], n = 2}}),
("dd[/-]mm",
Classifier{okData =
ClassData{prior = 0.0, unseen = -2.3025850929940455,
likelihoods = HashMap.fromList [("", 0.0)], n = 8},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("intersect by `de`",
Classifier{okData =
ClassData{prior = -0.19290366612449156,
unseen = -4.890349128221754,
likelihoods =
HashMap.fromList
[("Miercoleseste|en un <cycle>", -4.189654742026425),
("el <day-of-month> (non ordinal)intersect by `de`",
-3.784189633918261),
("daymonth", -1.8382794848629478),
("monthyear", -3.784189633918261),
("el <day-of-month> (non ordinal)Abril", -4.189654742026425),
("Marteseste|en un <cycle>", -4.189654742026425),
("Miercolesel <cycle> (proximo|que viene)", -4.189654742026425),
("el <time>Marzo", -3.784189633918261),
("el <day-of-month> (non ordinal)Septiembre",
-4.189654742026425),
("Miercolesel proximo <cycle> ", -4.189654742026425),
("Luneseste|en un <cycle>", -4.189654742026425),
("dayyear", -2.1102132003465894),
("dd-dd <month>(interval)year", -4.189654742026425),
("el <time>el <cycle> (proximo|que viene)", -4.189654742026425),
("el <day-of-month> (non ordinal)Julio", -4.189654742026425),
("el <time>year", -3.784189633918261),
("Septiembreyear", -4.189654742026425),
("<day-of-month> (ordinal or number) de <named-month>year",
-3.4965075614664802),
("el <time>la <cycle> pasado", -4.189654742026425),
("day of month (1st)Marzo", -3.2733640101522705),
("el <day-of-month> de <named-month>year", -3.784189633918261),
("el <time>este|en un <cycle>", -3.784189633918261),
("Mayoyear", -4.189654742026425),
("<day-of-month> (ordinal or number) de <named-month>year (value by adding three composing numbers together)",
-4.189654742026425),
("two time tokens separated by \",\"year", -3.4965075614664802),
("el <day-of-month> (non ordinal)Febrero", -4.189654742026425),
("two time tokens separated by \",\"intersect by `de`",
-4.189654742026425),
("dayweek", -2.4849066497880004),
("intersect by `de`year", -3.4965075614664802),
("el <day-of-month> (non ordinal)Marzo", -3.4965075614664802),
("Domingola <cycle> pasado", -4.189654742026425),
("two time tokens separated by \",\"Septiembre",
-4.189654742026425),
("el <day-of-month> (non ordinal)Mayo", -3.4965075614664802)],
n = 47},
koData =
ClassData{prior = -1.7404661748405046, unseen = -4.07753744390572,
likelihoods =
HashMap.fromList
[("Mayoyear (value by adding three composing numbers together)",
-3.367295829986474),
("monthyear", -2.268683541318364),
("Julioyear", -3.367295829986474),
("hourmonth", -2.9618307218783095),
("a las <time-of-day>Julio", -3.367295829986474),
("dayyear", -2.6741486494265287),
("<day-of-month> (ordinal or number) de <named-month>year",
-2.6741486494265287),
("Mayoyear", -2.6741486494265287),
("a las <time-of-day>Enero", -3.367295829986474)],
n = 10}}),
("n pasados <cycle>",
Classifier{okData =
ClassData{prior = 0.0, unseen = -2.1972245773362196,
likelihoods =
HashMap.fromList
[("number (0..15)a\241o (grain)", -1.3862943611198906),
("year", -1.3862943611198906),
("number (0..15)mes (grain)", -1.3862943611198906),
("month", -1.3862943611198906)],
n = 2},
koData =
ClassData{prior = -infinity, unseen = -1.6094379124341003,
likelihoods = HashMap.fromList [], n = 0}}),
("<hour-of-day> and half",
Classifier{okData =
ClassData{prior = 0.0, unseen = -2.772588722239781,
likelihoods =
HashMap.fromList
[("a las <time-of-day>", -1.3217558399823195),
("time-of-day (latent)", -1.3217558399823195),
("hour", -0.7621400520468967)],
n = 6},
koData =
ClassData{prior = -infinity, unseen = -1.3862943611198906,
likelihoods = HashMap.fromList [], n = 0}}),
("pasados n <cycle>",
Classifier{okData =
ClassData{prior = 0.0, unseen = -3.2188758248682006,
likelihoods =
HashMap.fromList
[("week", -2.4849066497880004),
("integer (numeric)dia (grain)", -2.4849066497880004),
("integer (numeric)mes (grain)", -2.4849066497880004),
("second", -2.4849066497880004),
("integer (numeric)minutos (grain)", -2.4849066497880004),
("day", -2.4849066497880004),
("integer (numeric)segundo (grain)", -2.4849066497880004),
("year", -2.4849066497880004), ("month", -2.4849066497880004),
("minute", -2.4849066497880004),
("integer (numeric)a\241o (grain)", -2.4849066497880004),
("number (0..15)semana (grain)", -2.4849066497880004)],
n = 6},
koData =
ClassData{prior = -infinity, unseen = -2.5649493574615367,
likelihoods = HashMap.fromList [], n = 0}}),
("<day-of-month> (ordinal or number) <named-month>",
Classifier{okData =
ClassData{prior = 0.0, unseen = -2.0794415416798357,
likelihoods =
HashMap.fromList
[("integer (numeric)Abril", -1.252762968495368),
("integer (numeric)Marzo", -1.252762968495368),
("month", -0.8472978603872037)],
n = 2},
koData =
ClassData{prior = -infinity, unseen = -1.3862943611198906,
likelihoods = HashMap.fromList [], n = 0}}),
("semana (grain)",
Classifier{okData =
ClassData{prior = 0.0, unseen = -3.0910424533583156,
likelihoods = HashMap.fromList [("", 0.0)], n = 20},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("two time tokens separated by \",\"",
Classifier{okData =
ClassData{prior = 0.0, unseen = -3.295836866004329,
likelihoods =
HashMap.fromList
[("Viernesintersect by `de`", -1.466337068793427),
("Lunes<day-of-month> (ordinal or number) de <named-month>",
-2.5649493574615367),
("dayday", -0.8602012652231115),
("Viernesel <day-of-month> de <named-month>",
-2.5649493574615367),
("Viernesel <time>", -2.159484249353372),
("Viernesel <day-of-month> (non ordinal)",
-2.5649493574615367)],
n = 10},
koData =
ClassData{prior = -infinity, unseen = -1.9459101490553135,
likelihoods = HashMap.fromList [], n = 0}}),
("<dim time> de la manana",
Classifier{okData =
ClassData{prior = -0.15415067982725836,
unseen = -2.772588722239781,
likelihoods =
HashMap.fromList
[("a las <time-of-day>", -1.3217558399823195),
("time-of-day (latent)", -1.3217558399823195),
("hour", -0.7621400520468967)],
n = 6},
koData =
ClassData{prior = -1.9459101490553135, unseen = -1.791759469228055,
likelihoods =
HashMap.fromList
[("time-of-day (latent)", -0.916290731874155),
("hour", -0.916290731874155)],
n = 1}}),
("big number 100 to 1K",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.3862943611198906,
likelihoods = HashMap.fromList [("", 0.0)], n = 2},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("del mediod\237a",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.0986122886681098,
likelihoods = HashMap.fromList [("", 0.0)], n = 1},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("D\237a de la Prematuridad Mundial",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.6094379124341003,
likelihoods = HashMap.fromList [("", 0.0)], n = 3},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("Mayo",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.9459101490553135,
likelihoods = HashMap.fromList [("", 0.0)], n = 5},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("Jueves",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.3862943611198906,
likelihoods = HashMap.fromList [("", 0.0)], n = 2},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("<time-of-day> <part-of-day>",
Classifier{okData =
ClassData{prior = -0.13353139262452263,
unseen = -4.3694478524670215,
likelihoods =
HashMap.fromList
[("dayhour", -2.277267285009756),
("Lunesin the <part-of-day>", -3.6635616461296463),
("tomorrowin the <part-of-day>", -3.6635616461296463),
("a las <time-of-day>del mediod\237a", -3.6635616461296463),
("el <day-of-month> de <named-month>in the <part-of-day>",
-3.6635616461296463),
("hourhour", -2.159484249353372),
("a las <time-of-day>in the <part-of-day>",
-2.4107986776342782),
("intersectin the <part-of-day>", -3.6635616461296463),
("minutehour", -1.717651497074333),
("intersect by `de`in the <part-of-day>", -3.6635616461296463),
("<hour-of-day> and halfin the <part-of-day>",
-3.258096538021482),
("<hour-of-day> <integer> (as relative minutes)in the <part-of-day>",
-3.6635616461296463),
("<hour-of-day> and <relative minutes>del mediod\237a",
-3.258096538021482),
("el <time>in the <part-of-day>", -3.6635616461296463),
("<day-of-month> (ordinal or number) de <named-month>in the <part-of-day>",
-3.6635616461296463),
("<hour-of-day> and quarterin the <part-of-day>",
-2.7472709142554916),
("yesterdayin the <part-of-day>", -3.6635616461296463),
("time-of-day (latent)in the <part-of-day>",
-2.7472709142554916)],
n = 28},
koData =
ClassData{prior = -2.0794415416798357,
unseen = -3.4339872044851463,
likelihoods =
HashMap.fromList
[("yearhour", -2.70805020110221),
("year (latent)del mediod\237a", -2.70805020110221),
("monthhour", -2.70805020110221),
("hourhour", -2.3025850929940455),
("Febreroin the <part-of-day>", -2.70805020110221),
("time-of-day (latent)in the <part-of-day>",
-2.3025850929940455)],
n = 4}}),
("de <datetime> - <datetime> (interval)",
Classifier{okData =
ClassData{prior = -infinity, unseen = -1.6094379124341003,
likelihoods = HashMap.fromList [], n = 0},
koData =
ClassData{prior = 0.0, unseen = -2.1972245773362196,
likelihoods =
HashMap.fromList
[("Diciembre<day-of-month> (ordinal or number) de <named-month>",
-1.3862943611198906),
("monthday", -1.3862943611198906),
("Diciembretime-of-day (latent)", -1.3862943611198906),
("monthhour", -1.3862943611198906)],
n = 2}}),
("<time-of-day> horas",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.6094379124341003,
likelihoods =
HashMap.fromList
[("time-of-day (latent)", -0.6931471805599453),
("hour", -0.6931471805599453)],
n = 1},
koData =
ClassData{prior = -infinity, unseen = -1.0986122886681098,
likelihoods = HashMap.fromList [], n = 0}}),
("intersect",
Classifier{okData =
ClassData{prior = -0.20585205420414873,
unseen = -4.663439094112067,
likelihoods =
HashMap.fromList
[("dayhour", -2.0149030205422647),
("Lunesin the <part-of-day>", -3.960813169597578),
("tomorrowin the <part-of-day>", -3.960813169597578),
("el <day-of-month> de <named-month>in the <part-of-day>",
-3.960813169597578),
("D\237a Internacional de las Cooperativasel <time>",
-3.960813169597578),
("hourhour", -3.044522437723423),
("now<hour-of-day> minus quarter (as relative minutes)",
-3.960813169597578),
("dayyear", -3.044522437723423),
("a las <time-of-day>in the <part-of-day>", -2.70805020110221),
("intersectin the <part-of-day>", -3.960813169597578),
("<named-month> <day-of-month>del <year>", -3.960813169597578),
("minutehour", -2.256065077359153),
("intersect by `de`in the <part-of-day>", -3.960813169597578),
("now<hour-of-day> and <relative minutes>", -3.960813169597578),
("<hour-of-day> and halfin the <part-of-day>",
-3.5553480614894135),
("tomorrowa las <time-of-day>", -3.5553480614894135),
("Miercoles<time-of-day> <part-of-day>", -3.960813169597578),
("<hour-of-day> <integer> (as relative minutes)in the <part-of-day>",
-3.960813169597578),
("Miercoles<dim time> de la manana", -3.960813169597578),
("dayminute", -3.044522437723423),
("<named-month> <day-of-month>el <time>", -3.960813169597578),
("Miercolesa las <time-of-day>", -3.960813169597578),
("el <time>in the <part-of-day>", -3.960813169597578),
("Miercolesintersect", -3.960813169597578),
("<day-of-month> (ordinal or number) de <named-month>in the <part-of-day>",
-3.960813169597578),
("nowa las <time-of-day>", -3.5553480614894135),
("D\237a Internacional de las Cooperativasdel <year>",
-3.960813169597578),
("<hour-of-day> and quarterin the <part-of-day>",
-3.044522437723423),
("yesterdayin the <part-of-day>", -3.960813169597578)],
n = 35},
koData =
ClassData{prior = -1.6817585740137264, unseen = -3.951243718581427,
likelihoods =
HashMap.fromList
[("hourday", -3.2386784521643803),
("dayhour", -2.5455312716044354),
("monthhour", -2.833213344056216),
("now<hour-of-day> and <relative minutes>",
-3.2386784521643803),
("Diciembrea las <time-of-day>", -3.2386784521643803),
("dayminute", -2.833213344056216),
("Febreroin the <part-of-day>", -3.2386784521643803),
("<day-of-month> (ordinal or number) de <named-month>a las <time-of-day>",
-3.2386784521643803),
("nowa las <time-of-day>", -2.5455312716044354),
("<time-of-day> am|pm<day-of-month> (ordinal or number) de <named-month>",
-3.2386784521643803)],
n = 8}}),
("Miercoles",
Classifier{okData =
ClassData{prior = 0.0, unseen = -2.3978952727983707,
likelihoods = HashMap.fromList [("", 0.0)], n = 9},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("a las <time-of-day>",
Classifier{okData =
ClassData{prior = -7.320340402329494e-2,
unseen = -5.135798437050262,
likelihoods =
HashMap.fromList
[("<hour-of-day> and half", -3.7436043538031827),
("<time-of-day> horas", -4.436751534363128),
("<hour-of-day> and quarter", -3.520460802488973),
("time-of-day (latent)", -1.4163266482187657),
("<hour-of-day> and <relative minutes>", -3.3381392456950185),
("<time-of-day> am|pm", -2.5649493574615367),
("<hour-of-day> minus <integer> (as relative minutes)",
-4.436751534363128),
("<hour-of-day> minus quarter (as relative minutes)",
-4.0312864262549635),
("hour", -1.3686985992295109), ("minute", -1.4923125551966876),
("<hour-of-day> <integer> (as relative minutes)",
-2.644992065135073)],
n = 79},
koData =
ClassData{prior = -2.6508917872622613,
unseen = -3.1780538303479458,
likelihoods =
HashMap.fromList
[("time-of-day (latent)", -1.5260563034950494),
("<hour-of-day> and <relative minutes>", -2.03688192726104),
("hour", -1.5260563034950494), ("minute", -2.03688192726104)],
n = 6}}),
("minutos (grain)",
Classifier{okData =
ClassData{prior = 0.0, unseen = -2.1972245773362196,
likelihoods = HashMap.fromList [("", 0.0)], n = 7},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("year (latent)",
Classifier{okData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0},
koData =
ClassData{prior = 0.0, unseen = -1.0986122886681098,
likelihoods = HashMap.fromList [("number (20..90)", 0.0)],
n = 1}}),
("Viernes",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.791759469228055,
likelihoods = HashMap.fromList [("", 0.0)], n = 4},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("el <cycle> (proximo|que viene)",
Classifier{okData =
ClassData{prior = 0.0, unseen = -2.70805020110221,
likelihoods =
HashMap.fromList
[("week", -1.540445040947149),
("semana (grain)", -1.540445040947149),
("mes (grain)", -1.9459101490553135),
("year", -1.9459101490553135),
("a\241o (grain)", -1.9459101490553135),
("month", -1.9459101490553135)],
n = 4},
koData =
ClassData{prior = -infinity, unseen = -1.9459101490553135,
likelihoods = HashMap.fromList [], n = 0}}),
("yesterday",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.3862943611198906,
likelihoods = HashMap.fromList [("", 0.0)], n = 2},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("<time-of-day> de la tarde",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.6094379124341003,
likelihoods =
HashMap.fromList
[("time-of-day (latent)number (0..15)", -0.6931471805599453),
("hour", -0.6931471805599453)],
n = 1},
koData =
ClassData{prior = -infinity, unseen = -1.0986122886681098,
likelihoods = HashMap.fromList [], n = 0}}),
("<hour-of-day> and quarter",
Classifier{okData =
ClassData{prior = 0.0, unseen = -3.0910424533583156,
likelihoods =
HashMap.fromList
[("a las <time-of-day>", -1.4350845252893227),
("time-of-day (latent)", -1.252762968495368),
("hour", -0.7419373447293773)],
n = 9},
koData =
ClassData{prior = -infinity, unseen = -1.3862943611198906,
likelihoods = HashMap.fromList [], n = 0}}),
("dentro de <duration>",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.6094379124341003,
likelihoods =
HashMap.fromList
[("<integer> <unit-of-duration>", -0.6931471805599453),
("hour", -0.6931471805599453)],
n = 1},
koData =
ClassData{prior = -infinity, unseen = -1.0986122886681098,
likelihoods = HashMap.fromList [], n = 0}}),
("hace <duration>",
Classifier{okData =
ClassData{prior = 0.0, unseen = -2.639057329615259,
likelihoods =
HashMap.fromList
[("week", -1.8718021769015913), ("year", -1.8718021769015913),
("<integer> <unit-of-duration>", -0.9555114450274363),
("hour", -1.8718021769015913), ("month", -1.8718021769015913)],
n = 4},
koData =
ClassData{prior = -infinity, unseen = -1.791759469228055,
likelihoods = HashMap.fromList [], n = 0}}),
("el <day-of-month> de <named-month>",
Classifier{okData =
ClassData{prior = 0.0, unseen = -3.4011973816621555,
likelihoods =
HashMap.fromList
[("number (0..15)Marzo", -2.6741486494265287),
("integer (numeric)Abril", -2.6741486494265287),
("number (0..15)Mayo", -2.268683541318364),
("integer (numeric)Marzo", -2.268683541318364),
("integer (numeric)Febrero", -2.6741486494265287),
("integer (numeric)Septiembre", -2.6741486494265287),
("month", -0.9694005571881036),
("integer (numeric)Mayo", -2.6741486494265287),
("integer (numeric)Julio", -2.6741486494265287)],
n = 10},
koData =
ClassData{prior = -infinity, unseen = -2.3025850929940455,
likelihoods = HashMap.fromList [], n = 0}}),
("D\237a Mundial de la Lengua \193rabe",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.3862943611198906,
likelihoods = HashMap.fromList [("", 0.0)], n = 2},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("D\237a de los Inocentes de Abril",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.791759469228055,
likelihoods = HashMap.fromList [("", 0.0)], n = 4},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("dia <day-of-month> (non ordinal)",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.6094379124341003,
likelihoods = HashMap.fromList [("number (0..15)", 0.0)], n = 3},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("el <time>",
Classifier{okData =
ClassData{prior = -2.5317807984289897e-2,
unseen = -4.543294782270004,
likelihoods =
HashMap.fromList
[("Martes", -3.4339872044851463),
("<named-month|named-day> past", -3.4339872044851463),
("dd[/-]mm", -3.146305132033365),
("intersect by `de`", -2.3353749158170367),
("<time-of-day> <part-of-day>", -3.8394523125933104),
("intersect", -3.8394523125933104),
("Miercoles", -3.4339872044851463),
("<day-of-month> (ordinal or number) de <named-month>",
-2.0476928433652555),
("Domingo", -3.4339872044851463),
("Lunes", -3.8394523125933104), ("day", -0.9490805546971459),
("year", -3.4339872044851463),
("day of month (1st)", -3.4339872044851463),
("<named-month|named-day> next", -3.8394523125933104),
("hour", -3.4339872044851463),
("this|next <day-of-week>", -3.8394523125933104)],
n = 39},
koData =
ClassData{prior = -3.6888794541139363, unseen = -2.995732273553991,
likelihoods =
HashMap.fromList
[("noon", -2.2512917986064953), ("hour", -2.2512917986064953)],
n = 1}}),
("Septiembre",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.0986122886681098,
likelihoods = HashMap.fromList [("", 0.0)], n = 1},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("<thousands> 0..999",
Classifier{okData =
ClassData{prior = -0.6931471805599453,
unseen = -1.6094379124341003,
likelihoods =
HashMap.fromList
[("1K or 1M in multipliable form<hundreds> 0..99",
-0.2876820724517809)],
n = 2},
koData =
ClassData{prior = -0.6931471805599453,
unseen = -1.6094379124341003,
likelihoods =
HashMap.fromList
[("1K or 1M in multipliable formbig number 100 to 1K",
-0.2876820724517809)],
n = 2}}),
("<day-of-month> (ordinal or number) de <named-month>",
Classifier{okData =
ClassData{prior = -8.338160893905101e-2,
unseen = -4.07753744390572,
likelihoods =
HashMap.fromList
[("ordinals (primero..10)Marzo", -2.9618307218783095),
("number (0..15)Marzo", -2.9618307218783095),
("integer (numeric)Abril", -2.9618307218783095),
("integer (numeric)Diciembre", -3.367295829986474),
("number (0..15)Mayo", -2.6741486494265287),
("integer (numeric)Enero", -3.367295829986474),
("integer (numeric)Marzo", -2.451005098112319),
("integer (numeric)Febrero", -2.268683541318364),
("integer (numeric)Septiembre", -3.367295829986474),
("month", -0.8823891801984737),
("integer (numeric)Mayo", -3.367295829986474),
("integer (numeric)Julio", -3.367295829986474)],
n = 23},
koData =
ClassData{prior = -2.5257286443082556, unseen = -2.833213344056216,
likelihoods =
HashMap.fromList
[("month", -1.6739764335716716),
("integer (numeric)Julio", -1.6739764335716716)],
n = 2}}),
("now",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.791759469228055,
likelihoods = HashMap.fromList [("", 0.0)], n = 4},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("ordinals (primero..10)",
Classifier{okData =
ClassData{prior = -1.791759469228055, unseen = -1.3862943611198906,
likelihoods = HashMap.fromList [("", 0.0)], n = 2},
koData =
ClassData{prior = -0.1823215567939546,
unseen = -2.4849066497880004,
likelihoods = HashMap.fromList [("", 0.0)], n = 10}}),
("invierno",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.0986122886681098,
likelihoods = HashMap.fromList [("", 0.0)], n = 1},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("this <part-of-day>",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.6094379124341003,
likelihoods =
HashMap.fromList
[("hour", -0.6931471805599453),
("evening", -0.6931471805599453)],
n = 1},
koData =
ClassData{prior = -infinity, unseen = -1.0986122886681098,
likelihoods = HashMap.fromList [], n = 0}}),
("number (0..15)",
Classifier{okData =
ClassData{prior = -0.13858616328614667,
unseen = -4.330733340286331,
likelihoods = HashMap.fromList [("", 0.0)], n = 74},
koData =
ClassData{prior = -2.044755983691946, unseen = -2.5649493574615367,
likelihoods = HashMap.fromList [("", 0.0)], n = 11}}),
("D\237a Internacional de las Cooperativas",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.0986122886681098,
likelihoods = HashMap.fromList [("", 0.0)], n = 1},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("Domingo",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.6094379124341003,
likelihoods = HashMap.fromList [("", 0.0)], n = 3},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("este|en un <cycle>",
Classifier{okData =
ClassData{prior = 0.0, unseen = -2.70805020110221,
likelihoods =
HashMap.fromList
[("week", -1.0296194171811581),
("semana (grain)", -1.0296194171811581),
("year", -1.9459101490553135),
("a\241o (grain)", -1.9459101490553135)],
n = 5},
koData =
ClassData{prior = -infinity, unseen = -1.6094379124341003,
likelihoods = HashMap.fromList [], n = 0}}),
("numbers prefix with -, negative or minus",
Classifier{okData =
ClassData{prior = -infinity, unseen = -1.0986122886681098,
likelihoods = HashMap.fromList [], n = 0},
koData =
ClassData{prior = 0.0, unseen = -2.4849066497880004,
likelihoods =
HashMap.fromList
[("integer (numeric)", -0.2006706954621511),
("number (0..15)", -1.7047480922384253)],
n = 9}}),
("Lunes",
Classifier{okData =
ClassData{prior = 0.0, unseen = -2.1972245773362196,
likelihoods = HashMap.fromList [("", 0.0)], n = 7},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("dd-dd <month>(interval)",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.9459101490553135,
likelihoods =
HashMap.fromList
[("Julio", -0.6931471805599453), ("month", -0.6931471805599453)],
n = 2},
koData =
ClassData{prior = -infinity, unseen = -1.0986122886681098,
likelihoods = HashMap.fromList [], n = 0}}),
("tomorrow",
Classifier{okData =
ClassData{prior = -0.12188981760903689, unseen = -4.02535169073515,
likelihoods = HashMap.fromList [("", 0.0)], n = 54},
koData =
ClassData{prior = -2.164963715117998, unseen = -2.1972245773362196,
likelihoods = HashMap.fromList [("", 0.0)], n = 7}}),
("mes (grain)",
Classifier{okData =
ClassData{prior = 0.0, unseen = -2.4849066497880004,
likelihoods = HashMap.fromList [("", 0.0)], n = 10},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("verano",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.0986122886681098,
likelihoods = HashMap.fromList [("", 0.0)], n = 1},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("number (20..90)",
Classifier{okData =
ClassData{prior = 0.0, unseen = -2.0794415416798357,
likelihoods = HashMap.fromList [("", 0.0)], n = 6},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("<day-of-week> <day-of-month>",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.6094379124341003,
likelihoods =
HashMap.fromList
[("day", -0.6931471805599453),
("Juevesinteger (numeric)", -0.6931471805599453)],
n = 1},
koData =
ClassData{prior = -infinity, unseen = -1.0986122886681098,
likelihoods = HashMap.fromList [], n = 0}}),
("fractional number",
Classifier{okData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0},
koData =
ClassData{prior = 0.0, unseen = -2.0794415416798357,
likelihoods = HashMap.fromList [("", 0.0)], n = 6}}),
("1K or 1M in multipliable form",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.3862943611198906,
likelihoods = HashMap.fromList [("", 0.0)], n = 2},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("afternoon",
Classifier{okData =
ClassData{prior = -0.2876820724517809,
unseen = -2.0794415416798357,
likelihoods = HashMap.fromList [("", 0.0)], n = 6},
koData =
ClassData{prior = -1.3862943611198906,
unseen = -1.3862943611198906,
likelihoods = HashMap.fromList [("", 0.0)], n = 2}}),
("time-of-day (latent)",
Classifier{okData =
ClassData{prior = -0.6592456288842639, unseen = -3.891820298110627,
likelihoods =
HashMap.fromList
[("integer (numeric)", -1.3062516534463542),
("number (0..15)", -0.3448404862917295)],
n = 45},
koData =
ClassData{prior = -0.7282385003712154, unseen = -3.828641396489095,
likelihoods =
HashMap.fromList
[("integer (numeric)", -1.5040773967762742),
("number (0..15)", -0.7156200364120039),
("integer (0-9) with two digits", -1.241713132308783)],
n = 42}}),
("<hour-of-day> and <relative minutes>",
Classifier{okData =
ClassData{prior = -0.3364722366212129, unseen = -3.332204510175204,
likelihoods =
HashMap.fromList
[("time-of-day (latent)number (21..29 31..39 41..49 51..59 61..69 71..79 81..89 91..99)",
-2.1972245773362196),
("time-of-day (latent)number (0..15)", -2.6026896854443837),
("a las <time-of-day>number (20..90)", -2.1972245773362196),
("a las <time-of-day>number (21..29 31..39 41..49 51..59 61..69 71..79 81..89 91..99)",
-2.1972245773362196),
("hour", -0.8979415932059586),
("a las <time-of-day>number (0..15)", -2.6026896854443837),
("time-of-day (latent)number (20..90)", -2.1972245773362196)],
n = 10},
koData =
ClassData{prior = -1.252762968495368, unseen = -2.772588722239781,
likelihoods =
HashMap.fromList
[("a las <time-of-day>number (20..90)", -1.6094379124341003),
("hour", -1.0986122886681098),
("time-of-day (latent)number (20..90)", -1.6094379124341003)],
n = 4}}),
("year",
Classifier{okData =
ClassData{prior = -0.8266785731844679,
unseen = -2.3978952727983707,
likelihoods =
HashMap.fromList
[("integer (numeric)", -0.5108256237659907),
("<thousands> 0..999", -1.2039728043259361)],
n = 7},
koData =
ClassData{prior = -0.5753641449035618,
unseen = -2.5649493574615367,
likelihoods =
HashMap.fromList
[("integer (numeric)", -0.6931471805599453),
("<thousands> 0..999", -1.3862943611198906),
("1K or 1M in multipliable form", -1.3862943611198906)],
n = 9}}),
("en <duration>",
Classifier{okData =
ClassData{prior = 0.0, unseen = -3.6635616461296463,
likelihoods =
HashMap.fromList
[("week", -2.9444389791664407), ("second", -2.9444389791664407),
("day", -2.538973871058276), ("year", -2.538973871058276),
("<integer> <unit-of-duration>", -0.8649974374866046),
("hour", -2.2512917986064953), ("month", -2.9444389791664407),
("minute", -1.845826690498331)],
n = 15},
koData =
ClassData{prior = -infinity, unseen = -2.1972245773362196,
likelihoods = HashMap.fromList [], n = 0}}),
("n <cycle> (proximo|que viene)",
Classifier{okData =
ClassData{prior = 0.0, unseen = -2.5649493574615367,
likelihoods =
HashMap.fromList
[("week", -1.791759469228055),
("integer (numeric)semana (grain)", -1.791759469228055),
("year", -1.791759469228055),
("number (0..15)mes (grain)", -1.791759469228055),
("month", -1.791759469228055),
("integer (numeric)a\241o (grain)", -1.791759469228055)],
n = 3},
koData =
ClassData{prior = -infinity, unseen = -1.9459101490553135,
likelihoods = HashMap.fromList [], n = 0}}),
("<integer> <unit-of-duration>",
Classifier{okData =
ClassData{prior = -0.587786664902119, unseen = -4.143134726391533,
likelihoods =
HashMap.fromList
[("week", -3.028522096376982),
("integer (numeric)hora (grain)", -3.4339872044851463),
("integer (numeric)dia (grain)", -3.4339872044851463),
("number (0..15)segundo (grain)", -3.4339872044851463),
("second", -3.4339872044851463),
("number (0..15)a\241o (grain)", -3.028522096376982),
("integer (numeric)minutos (grain)", -2.740840023925201),
("day", -3.028522096376982), ("year", -2.740840023925201),
("number (0..15)mes (grain)", -3.028522096376982),
("number (0..15)hora (grain)", -2.740840023925201),
("hour", -2.3353749158170367), ("month", -3.028522096376982),
("number (0..15)dia (grain)", -3.4339872044851463),
("number (0..15)minutos (grain)", -3.028522096376982),
("number (16..19 21..29)hora (grain)", -3.4339872044851463),
("minute", -2.3353749158170367),
("integer (numeric)a\241o (grain)", -3.4339872044851463),
("number (0..15)semana (grain)", -3.028522096376982)],
n = 20},
koData =
ClassData{prior = -0.8109302162163288, unseen = -4.007333185232471,
likelihoods =
HashMap.fromList
[("week", -2.890371757896165),
("integer (numeric)hora (grain)", -2.890371757896165),
("integer (numeric)dia (grain)", -2.890371757896165),
("integer (numeric)mes (grain)", -3.295836866004329),
("second", -2.890371757896165),
("number (0..15)a\241o (grain)", -3.295836866004329),
("integer (numeric)semana (grain)", -3.295836866004329),
("integer (numeric)minutos (grain)", -2.890371757896165),
("day", -2.890371757896165),
("integer (numeric)segundo (grain)", -2.890371757896165),
("year", -2.6026896854443837),
("number (0..15)mes (grain)", -2.890371757896165),
("hour", -2.890371757896165), ("month", -2.6026896854443837),
("minute", -2.890371757896165),
("integer (numeric)a\241o (grain)", -2.890371757896165),
("number (0..15)semana (grain)", -3.295836866004329)],
n = 16}}),
("proximas n <cycle>",
Classifier{okData =
ClassData{prior = 0.0, unseen = -3.2188758248682006,
likelihoods =
HashMap.fromList
[("integer (numeric)hora (grain)", -2.4849066497880004),
("integer (numeric)dia (grain)", -2.4849066497880004),
("second", -2.4849066497880004),
("number (0..15)a\241o (grain)", -2.4849066497880004),
("integer (numeric)minutos (grain)", -2.4849066497880004),
("day", -2.4849066497880004),
("integer (numeric)segundo (grain)", -2.4849066497880004),
("year", -2.4849066497880004),
("number (0..15)mes (grain)", -2.4849066497880004),
("hour", -2.4849066497880004), ("month", -2.4849066497880004),
("minute", -2.4849066497880004)],
n = 6},
koData =
ClassData{prior = -infinity, unseen = -2.5649493574615367,
likelihoods = HashMap.fromList [], n = 0}}),
("<time-of-day> am|pm",
Classifier{okData =
ClassData{prior = -0.7069405026922811, unseen = -4.356708826689592,
likelihoods =
HashMap.fromList
[("a las <time-of-day>", -1.7788560643921472),
("time-of-day (latent)", -3.6506582412937383),
("hour", -3.245193133185574), ("minute", -0.7884573603642702),
("<hour-of-day> <integer> (as relative minutes)",
-1.1657515915057381)],
n = 36},
koData =
ClassData{prior = -0.6795415285041666, unseen = -4.382026634673881,
likelihoods =
HashMap.fromList
[("time-of-day (latent)", -1.1113513144455396),
("hour", -1.1113513144455396), ("minute", -1.8044984950054848),
("<hour-of-day> <integer> (as relative minutes)",
-1.8044984950054848)],
n = 37}}),
("n proximas <cycle>",
Classifier{okData =
ClassData{prior = 0.0, unseen = -2.5649493574615367,
likelihoods =
HashMap.fromList
[("week", -1.791759469228055),
("integer (numeric)mes (grain)", -1.791759469228055),
("integer (numeric)semana (grain)", -1.791759469228055),
("year", -1.791759469228055), ("month", -1.791759469228055),
("integer (numeric)a\241o (grain)", -1.791759469228055)],
n = 3},
koData =
ClassData{prior = -infinity, unseen = -1.9459101490553135,
likelihoods = HashMap.fromList [], n = 0}}),
("ano nuevo",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.3862943611198906,
likelihoods = HashMap.fromList [("", 0.0)], n = 2},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("la <cycle> pasado",
Classifier{okData =
ClassData{prior = 0.0, unseen = -2.3978952727983707,
likelihoods =
HashMap.fromList
[("week", -1.2039728043259361),
("semana (grain)", -1.2039728043259361),
("year", -1.6094379124341003),
("a\241o (grain)", -1.6094379124341003)],
n = 3},
koData =
ClassData{prior = -infinity, unseen = -1.6094379124341003,
likelihoods = HashMap.fromList [], n = 0}}),
("la pasado <cycle>",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.6094379124341003,
likelihoods =
HashMap.fromList
[("mes (grain)", -0.6931471805599453),
("month", -0.6931471805599453)],
n = 1},
koData =
ClassData{prior = -infinity, unseen = -1.0986122886681098,
likelihoods = HashMap.fromList [], n = 0}}),
("number (21..29 31..39 41..49 51..59 61..69 71..79 81..89 91..99)",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.3862943611198906,
likelihoods =
HashMap.fromList [("number (20..90)number (0..15)", 0.0)],
n = 2},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("day of month (1st)",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.791759469228055,
likelihoods = HashMap.fromList [("", 0.0)], n = 4},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("Sabado",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.0986122886681098,
likelihoods = HashMap.fromList [("", 0.0)], n = 1},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("Diciembre",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.0986122886681098,
likelihoods = HashMap.fromList [("", 0.0)], n = 1},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("D\237a de la Cero Discriminaci\243n",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.3862943611198906,
likelihoods = HashMap.fromList [("", 0.0)], n = 2},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("a\241o (grain)",
Classifier{okData =
ClassData{prior = 0.0, unseen = -2.639057329615259,
likelihoods = HashMap.fromList [("", 0.0)], n = 12},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("Julio",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.6094379124341003,
likelihoods = HashMap.fromList [("", 0.0)], n = 3},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("<hundreds> 0..99",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.3862943611198906,
likelihoods =
HashMap.fromList [("big number 100 to 1Knumber (20..90)", 0.0)],
n = 2},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("<hour-of-day> minus <integer> (as relative minutes)",
Classifier{okData =
ClassData{prior = 0.0, unseen = -2.0794415416798357,
likelihoods =
HashMap.fromList
[("time-of-day (latent)number (0..15)", -1.252762968495368),
("hour", -0.8472978603872037),
("a las <time-of-day>number (0..15)", -1.252762968495368)],
n = 2},
koData =
ClassData{prior = -infinity, unseen = -1.3862943611198906,
likelihoods = HashMap.fromList [], n = 0}}),
("<named-month|named-day> next",
Classifier{okData =
ClassData{prior = 0.0, unseen = -2.3978952727983707,
likelihoods =
HashMap.fromList
[("Martes", -1.6094379124341003),
("Miercoles", -1.6094379124341003),
("el <time>", -1.6094379124341003),
("day", -0.916290731874155)],
n = 3},
koData =
ClassData{prior = -infinity, unseen = -1.6094379124341003,
likelihoods = HashMap.fromList [], n = 0}}),
("number (16..19 21..29)",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.0986122886681098,
likelihoods = HashMap.fromList [("", 0.0)], n = 1},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("<dim time> de la tarde",
Classifier{okData =
ClassData{prior = -5.406722127027582e-2,
unseen = -3.784189633918261,
likelihoods =
HashMap.fromList
[("<hour-of-day> and half", -2.662587827025453),
("a las <time-of-day>", -1.6817585740137264),
("<hour-of-day> and quarter", -2.151762203259462),
("time-of-day (latent)", -2.151762203259462),
("hour", -1.563975538357343), ("minute", -1.363304842895192),
("<hour-of-day> <integer> (as relative minutes)",
-3.068052935133617)],
n = 18},
koData =
ClassData{prior = -2.9444389791664407,
unseen = -2.3025850929940455,
likelihoods =
HashMap.fromList
[("time-of-day (latent)", -1.5040773967762742),
("hour", -1.5040773967762742)],
n = 1}}),
("el proximo <cycle> ",
Classifier{okData =
ClassData{prior = 0.0, unseen = -2.70805020110221,
likelihoods =
HashMap.fromList
[("week", -1.540445040947149),
("semana (grain)", -1.540445040947149),
("mes (grain)", -1.9459101490553135),
("year", -1.9459101490553135),
("a\241o (grain)", -1.9459101490553135),
("month", -1.9459101490553135)],
n = 4},
koData =
ClassData{prior = -infinity, unseen = -1.9459101490553135,
likelihoods = HashMap.fromList [], n = 0}}),
("<hour-of-day> minus quarter (as relative minutes)",
Classifier{okData =
ClassData{prior = 0.0, unseen = -2.4849066497880004,
likelihoods =
HashMap.fromList
[("a las <time-of-day>", -1.2992829841302609),
("time-of-day (latent)", -1.2992829841302609),
("hour", -0.7884573603642702)],
n = 4},
koData =
ClassData{prior = -infinity, unseen = -1.3862943611198906,
likelihoods = HashMap.fromList [], n = 0}}),
("the day after tomorrow",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.0986122886681098,
likelihoods = HashMap.fromList [("", 0.0)], n = 1},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("del <year>",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.3862943611198906,
likelihoods = HashMap.fromList [("integer (numeric)", 0.0)],
n = 2},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("dd[/-.]mm[/-.]yyyy",
Classifier{okData =
ClassData{prior = 0.0, unseen = -2.0794415416798357,
likelihoods = HashMap.fromList [("", 0.0)], n = 6},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("noon",
Classifier{okData =
ClassData{prior = -0.2876820724517809,
unseen = -1.6094379124341003,
likelihoods = HashMap.fromList [("", 0.0)], n = 3},
koData =
ClassData{prior = -1.3862943611198906,
unseen = -1.0986122886681098,
likelihoods = HashMap.fromList [("", 0.0)], n = 1}}),
("evening",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.791759469228055,
likelihoods = HashMap.fromList [("", 0.0)], n = 4},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("Febrero",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.9459101490553135,
likelihoods = HashMap.fromList [("", 0.0)], n = 5},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("next week",
Classifier{okData =
ClassData{prior = -0.40546510810816444,
unseen = -1.9459101490553135,
likelihoods =
HashMap.fromList
[("week", -0.6931471805599453),
("semana (grain)", -0.6931471805599453)],
n = 2},
koData =
ClassData{prior = -1.0986122886681098,
unseen = -1.6094379124341003,
likelihoods =
HashMap.fromList
[("week", -0.6931471805599453),
("semana (grain)", -0.6931471805599453)],
n = 1}}),
("<datetime> - <datetime> (interval)",
Classifier{okData =
ClassData{prior = -0.916290731874155, unseen = -2.5649493574615367,
likelihoods =
HashMap.fromList
[("minuteminute", -1.791759469228055),
("dayday", -1.791759469228055),
("hh(:|.|h)mm (time-of-day)hh(:|.|h)mm (time-of-day)",
-1.791759469228055),
("<day-of-month> (ordinal or number) de <named-month><day-of-month> (ordinal or number) de <named-month>",
-1.791759469228055)],
n = 2},
koData =
ClassData{prior = -0.5108256237659907, unseen = -2.70805020110221,
likelihoods =
HashMap.fromList
[("Diciembre<day-of-month> (ordinal or number) de <named-month>",
-1.9459101490553135),
("monthday", -1.9459101490553135),
("dayyear", -1.540445040947149),
("dd[/-]mmyear", -1.540445040947149)],
n = 3}}),
("Enero",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.0986122886681098,
likelihoods = HashMap.fromList [("", 0.0)], n = 1},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("el <day-of-month> (non ordinal)",
Classifier{okData =
ClassData{prior = -6.453852113757118e-2,
unseen = -2.890371757896165,
likelihoods =
HashMap.fromList
[("integer (numeric)", -0.2682639865946794),
("number (0..15)", -1.4469189829363254)],
n = 15},
koData =
ClassData{prior = -2.772588722239781, unseen = -1.3862943611198906,
likelihoods =
HashMap.fromList [("integer (numeric)", -0.40546510810816444)],
n = 1}}),
("segundo (grain)",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.6094379124341003,
likelihoods = HashMap.fromList [("", 0.0)], n = 3},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("next week (alt)",
Classifier{okData =
ClassData{prior = -0.3364722366212129,
unseen = -2.5649493574615367,
likelihoods =
HashMap.fromList
[("week", -0.6931471805599453),
("semana (grain)", -0.6931471805599453)],
n = 5},
koData =
ClassData{prior = -1.252762968495368, unseen = -1.9459101490553135,
likelihoods =
HashMap.fromList
[("week", -0.6931471805599453),
("semana (grain)", -0.6931471805599453)],
n = 2}}),
("Marzo",
Classifier{okData =
ClassData{prior = 0.0, unseen = -2.4849066497880004,
likelihoods = HashMap.fromList [("", 0.0)], n = 10},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("<named-month> <day-of-month>",
Classifier{okData =
ClassData{prior = 0.0, unseen = -2.3978952727983707,
likelihoods =
HashMap.fromList
[("Marzointeger (numeric)", -1.6094379124341003),
("Abrilinteger (numeric)", -1.6094379124341003),
("month", -0.916290731874155),
("Mayointeger (numeric)", -1.6094379124341003)],
n = 3},
koData =
ClassData{prior = -infinity, unseen = -1.6094379124341003,
likelihoods = HashMap.fromList [], n = 0}}),
("dia (grain)",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.791759469228055,
likelihoods = HashMap.fromList [("", 0.0)], n = 4},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("in the <part-of-day>",
Classifier{okData =
ClassData{prior = -0.2682639865946794,
unseen = -3.4339872044851463,
likelihoods =
HashMap.fromList
[("afternoon", -1.455287232606842),
("hour", -0.7621400520468967), ("evening", -2.0149030205422647),
("morning", -1.791759469228055)],
n = 13},
koData =
ClassData{prior = -1.4469189829363254,
unseen = -2.5649493574615367,
likelihoods =
HashMap.fromList
[("afternoon", -1.3862943611198906),
("hour", -0.8754687373538999),
("morning", -1.3862943611198906)],
n = 4}}),
("this|next <day-of-week>",
Classifier{okData =
ClassData{prior = 0.0, unseen = -2.3025850929940455,
likelihoods =
HashMap.fromList
[("Viernes", -1.0986122886681098),
("Lunes", -1.5040773967762742), ("day", -0.8109302162163288)],
n = 3},
koData =
ClassData{prior = -infinity, unseen = -1.3862943611198906,
likelihoods = HashMap.fromList [], n = 0}}),
("morning",
Classifier{okData =
ClassData{prior = -0.40546510810816444,
unseen = -1.791759469228055,
likelihoods = HashMap.fromList [("", 0.0)], n = 4},
koData =
ClassData{prior = -1.0986122886681098,
unseen = -1.3862943611198906,
likelihoods = HashMap.fromList [("", 0.0)], n = 2}}),
("week-end",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.3862943611198906,
likelihoods = HashMap.fromList [("", 0.0)], n = 2},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("Nochevieja",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.0986122886681098,
likelihoods = HashMap.fromList [("", 0.0)], n = 1},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("year (value by adding three composing numbers together)",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.3862943611198906,
likelihoods =
HashMap.fromList [("big number 100 to 1Knumber (20..90)", 0.0)],
n = 2},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("hora (grain)",
Classifier{okData =
ClassData{prior = -0.15415067982725836,
unseen = -2.0794415416798357,
likelihoods = HashMap.fromList [("", 0.0)], n = 6},
koData =
ClassData{prior = -1.9459101490553135,
unseen = -1.0986122886681098,
likelihoods = HashMap.fromList [("", 0.0)], n = 1}}),
("right now",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.791759469228055,
likelihoods = HashMap.fromList [("", 0.0)], n = 4},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("Navidad",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.3862943611198906,
likelihoods = HashMap.fromList [("", 0.0)], n = 2},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("<hour-of-day> <integer> (as relative minutes)",
Classifier{okData =
ClassData{prior = -0.40546510810816444,
unseen = -3.9889840465642745,
likelihoods =
HashMap.fromList
[("a las <time-of-day>integer (0-9) with two digits",
-1.4853852637641216),
("time-of-day (latent)integer (0-9) with two digits",
-1.405342556090585),
("time-of-day (latent)number (0..15)", -3.2771447329921766),
("hour", -0.7514160886839211)],
n = 24},
koData =
ClassData{prior = -1.0986122886681098,
unseen = -3.4011973816621555,
likelihoods =
HashMap.fromList
[("time-of-day (latent)integer (numeric)", -1.9810014688665833),
("time-of-day (latent)number (0..15)", -1.0647107369924282),
("hour", -0.8023464725249373)],
n = 12}}),
("integer (0-9) with two digits",
Classifier{okData =
ClassData{prior = 0.0, unseen = -2.70805020110221,
likelihoods =
HashMap.fromList
[("integer (numeric)", -1.252762968495368),
("number (0..15)", -0.3364722366212129)],
n = 12},
koData =
ClassData{prior = -infinity, unseen = -1.0986122886681098,
likelihoods = HashMap.fromList [], n = 0}}),
("ce <time>",
Classifier{okData =
ClassData{prior = 0.0, unseen = -2.833213344056216,
likelihoods =
HashMap.fromList
[("invierno", -2.0794415416798357),
("Lunes", -2.0794415416798357), ("verano", -2.0794415416798357),
("day", -1.3862943611198906), ("hour", -1.6739764335716716),
("week-end", -1.6739764335716716)],
n = 5},
koData =
ClassData{prior = -infinity, unseen = -1.9459101490553135,
likelihoods = HashMap.fromList [], n = 0}})] | 88,651 | classifiers
= HashMap.fromList
[("midnight",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.0986122886681098,
likelihoods = HashMap.fromList [("", 0.0)], n = 1},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("Martes",
Classifier{okData =
ClassData{prior = 0.0, unseen = -2.0794415416798357,
likelihoods = HashMap.fromList [("", 0.0)], n = 6},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("<time> timezone",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.6094379124341003,
likelihoods =
HashMap.fromList
[("a las <time-of-day>", -0.6931471805599453),
("hour", -0.6931471805599453)],
n = 1},
koData =
ClassData{prior = -infinity, unseen = -1.0986122886681098,
likelihoods = HashMap.fromList [], n = 0}}),
("integer (numeric)",
Classifier{okData =
ClassData{prior = -0.5659920050746986, unseen = -4.23410650459726,
likelihoods = HashMap.fromList [("", 0.0)], n = 67},
koData =
ClassData{prior = -0.8388589917413389, unseen = -3.970291913552122,
likelihoods = HashMap.fromList [("", 0.0)], n = 51}}),
("the day before yesterday",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.3862943611198906,
likelihoods = HashMap.fromList [("", 0.0)], n = 2},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("hh(:|.|h)mm (time-of-day)",
Classifier{okData =
ClassData{prior = 0.0, unseen = -2.3978952727983707,
likelihoods = HashMap.fromList [("", 0.0)], n = 9},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("<named-month|named-day> past",
Classifier{okData =
ClassData{prior = 0.0, unseen = -2.5649493574615367,
likelihoods =
HashMap.fromList
[("Martes", -1.791759469228055),
("el <time>", -1.3862943611198906),
("Domingo", -1.791759469228055), ("day", -0.8754687373538999)],
n = 4},
koData =
ClassData{prior = -infinity, unseen = -1.6094379124341003,
likelihoods = HashMap.fromList [], n = 0}}),
("Abril",
Classifier{okData =
ClassData{prior = -0.40546510810816444,
unseen = -1.791759469228055,
likelihoods = HashMap.fromList [("", 0.0)], n = 4},
koData =
ClassData{prior = -1.0986122886681098,
unseen = -1.3862943611198906,
likelihoods = HashMap.fromList [("", 0.0)], n = 2}}),
("dd[/-]mm",
Classifier{okData =
ClassData{prior = 0.0, unseen = -2.3025850929940455,
likelihoods = HashMap.fromList [("", 0.0)], n = 8},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("intersect by `de`",
Classifier{okData =
ClassData{prior = -0.19290366612449156,
unseen = -4.890349128221754,
likelihoods =
HashMap.fromList
[("Miercoleseste|en un <cycle>", -4.189654742026425),
("el <day-of-month> (non ordinal)intersect by `de`",
-3.784189633918261),
("daymonth", -1.8382794848629478),
("monthyear", -3.784189633918261),
("el <day-of-month> (non ordinal)Abril", -4.189654742026425),
("Marteseste|en un <cycle>", -4.189654742026425),
("Miercolesel <cycle> (proximo|que viene)", -4.189654742026425),
("el <time>Marzo", -3.784189633918261),
("el <day-of-month> (non ordinal)Septiembre",
-4.189654742026425),
("Miercolesel proximo <cycle> ", -4.189654742026425),
("Luneseste|en un <cycle>", -4.189654742026425),
("dayyear", -2.1102132003465894),
("dd-dd <month>(interval)year", -4.189654742026425),
("el <time>el <cycle> (proximo|que viene)", -4.189654742026425),
("el <day-of-month> (non ordinal)Julio", -4.189654742026425),
("el <time>year", -3.784189633918261),
("Septiembreyear", -4.189654742026425),
("<day-of-month> (ordinal or number) de <named-month>year",
-3.4965075614664802),
("el <time>la <cycle> pasado", -4.189654742026425),
("day of month (1st)Marzo", -3.2733640101522705),
("el <day-of-month> de <named-month>year", -3.784189633918261),
("el <time>este|en un <cycle>", -3.784189633918261),
("Mayoyear", -4.189654742026425),
("<day-of-month> (ordinal or number) de <named-month>year (value by adding three composing numbers together)",
-4.189654742026425),
("two time tokens separated by \",\"year", -3.4965075614664802),
("el <day-of-month> (non ordinal)Febrero", -4.189654742026425),
("two time tokens separated by \",\"intersect by `de`",
-4.189654742026425),
("dayweek", -2.4849066497880004),
("intersect by `de`year", -3.4965075614664802),
("el <day-of-month> (non ordinal)Marzo", -3.4965075614664802),
("Domingola <cycle> pasado", -4.189654742026425),
("two time tokens separated by \",\"Septiembre",
-4.189654742026425),
("el <day-of-month> (non ordinal)Mayo", -3.4965075614664802)],
n = 47},
koData =
ClassData{prior = -1.7404661748405046, unseen = -4.07753744390572,
likelihoods =
HashMap.fromList
[("Mayoyear (value by adding three composing numbers together)",
-3.367295829986474),
("monthyear", -2.268683541318364),
("Julioyear", -3.367295829986474),
("hourmonth", -2.9618307218783095),
("a las <time-of-day>Julio", -3.367295829986474),
("dayyear", -2.6741486494265287),
("<day-of-month> (ordinal or number) de <named-month>year",
-2.6741486494265287),
("Mayoyear", -2.6741486494265287),
("a las <time-of-day>Enero", -3.367295829986474)],
n = 10}}),
("n pasados <cycle>",
Classifier{okData =
ClassData{prior = 0.0, unseen = -2.1972245773362196,
likelihoods =
HashMap.fromList
[("number (0..15)a\241o (grain)", -1.3862943611198906),
("year", -1.3862943611198906),
("number (0..15)mes (grain)", -1.3862943611198906),
("month", -1.3862943611198906)],
n = 2},
koData =
ClassData{prior = -infinity, unseen = -1.6094379124341003,
likelihoods = HashMap.fromList [], n = 0}}),
("<hour-of-day> and half",
Classifier{okData =
ClassData{prior = 0.0, unseen = -2.772588722239781,
likelihoods =
HashMap.fromList
[("a las <time-of-day>", -1.3217558399823195),
("time-of-day (latent)", -1.3217558399823195),
("hour", -0.7621400520468967)],
n = 6},
koData =
ClassData{prior = -infinity, unseen = -1.3862943611198906,
likelihoods = HashMap.fromList [], n = 0}}),
("pasados n <cycle>",
Classifier{okData =
ClassData{prior = 0.0, unseen = -3.2188758248682006,
likelihoods =
HashMap.fromList
[("week", -2.4849066497880004),
("integer (numeric)dia (grain)", -2.4849066497880004),
("integer (numeric)mes (grain)", -2.4849066497880004),
("second", -2.4849066497880004),
("integer (numeric)minutos (grain)", -2.4849066497880004),
("day", -2.4849066497880004),
("integer (numeric)segundo (grain)", -2.4849066497880004),
("year", -2.4849066497880004), ("month", -2.4849066497880004),
("minute", -2.4849066497880004),
("integer (numeric)a\241o (grain)", -2.4849066497880004),
("number (0..15)semana (grain)", -2.4849066497880004)],
n = 6},
koData =
ClassData{prior = -infinity, unseen = -2.5649493574615367,
likelihoods = HashMap.fromList [], n = 0}}),
("<day-of-month> (ordinal or number) <named-month>",
Classifier{okData =
ClassData{prior = 0.0, unseen = -2.0794415416798357,
likelihoods =
HashMap.fromList
[("integer (numeric)Abril", -1.252762968495368),
("integer (numeric)Marzo", -1.252762968495368),
("month", -0.8472978603872037)],
n = 2},
koData =
ClassData{prior = -infinity, unseen = -1.3862943611198906,
likelihoods = HashMap.fromList [], n = 0}}),
("semana (grain)",
Classifier{okData =
ClassData{prior = 0.0, unseen = -3.0910424533583156,
likelihoods = HashMap.fromList [("", 0.0)], n = 20},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("two time tokens separated by \",\"",
Classifier{okData =
ClassData{prior = 0.0, unseen = -3.295836866004329,
likelihoods =
HashMap.fromList
[("Viernesintersect by `de`", -1.466337068793427),
("Lunes<day-of-month> (ordinal or number) de <named-month>",
-2.5649493574615367),
("dayday", -0.8602012652231115),
("Viernesel <day-of-month> de <named-month>",
-2.5649493574615367),
("Viernesel <time>", -2.159484249353372),
("Viernesel <day-of-month> (non ordinal)",
-2.5649493574615367)],
n = 10},
koData =
ClassData{prior = -infinity, unseen = -1.9459101490553135,
likelihoods = HashMap.fromList [], n = 0}}),
("<dim time> de la manana",
Classifier{okData =
ClassData{prior = -0.15415067982725836,
unseen = -2.772588722239781,
likelihoods =
HashMap.fromList
[("a las <time-of-day>", -1.3217558399823195),
("time-of-day (latent)", -1.3217558399823195),
("hour", -0.7621400520468967)],
n = 6},
koData =
ClassData{prior = -1.9459101490553135, unseen = -1.791759469228055,
likelihoods =
HashMap.fromList
[("time-of-day (latent)", -0.916290731874155),
("hour", -0.916290731874155)],
n = 1}}),
("big number 100 to 1K",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.3862943611198906,
likelihoods = HashMap.fromList [("", 0.0)], n = 2},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("del mediod\237a",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.0986122886681098,
likelihoods = HashMap.fromList [("", 0.0)], n = 1},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("D\237a de la Prematuridad Mundial",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.6094379124341003,
likelihoods = HashMap.fromList [("", 0.0)], n = 3},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("Mayo",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.9459101490553135,
likelihoods = HashMap.fromList [("", 0.0)], n = 5},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("Jueves",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.3862943611198906,
likelihoods = HashMap.fromList [("", 0.0)], n = 2},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("<time-of-day> <part-of-day>",
Classifier{okData =
ClassData{prior = -0.13353139262452263,
unseen = -4.3694478524670215,
likelihoods =
HashMap.fromList
[("dayhour", -2.277267285009756),
("Lunesin the <part-of-day>", -3.6635616461296463),
("tomorrowin the <part-of-day>", -3.6635616461296463),
("a las <time-of-day>del mediod\237a", -3.6635616461296463),
("el <day-of-month> de <named-month>in the <part-of-day>",
-3.6635616461296463),
("hourhour", -2.159484249353372),
("a las <time-of-day>in the <part-of-day>",
-2.4107986776342782),
("intersectin the <part-of-day>", -3.6635616461296463),
("minutehour", -1.717651497074333),
("intersect by `de`in the <part-of-day>", -3.6635616461296463),
("<hour-of-day> and halfin the <part-of-day>",
-3.258096538021482),
("<hour-of-day> <integer> (as relative minutes)in the <part-of-day>",
-3.6635616461296463),
("<hour-of-day> and <relative minutes>del mediod\237a",
-3.258096538021482),
("el <time>in the <part-of-day>", -3.6635616461296463),
("<day-of-month> (ordinal or number) de <named-month>in the <part-of-day>",
-3.6635616461296463),
("<hour-of-day> and quarterin the <part-of-day>",
-2.7472709142554916),
("yesterdayin the <part-of-day>", -3.6635616461296463),
("time-of-day (latent)in the <part-of-day>",
-2.7472709142554916)],
n = 28},
koData =
ClassData{prior = -2.0794415416798357,
unseen = -3.4339872044851463,
likelihoods =
HashMap.fromList
[("yearhour", -2.70805020110221),
("year (latent)del mediod\237a", -2.70805020110221),
("monthhour", -2.70805020110221),
("hourhour", -2.3025850929940455),
("Febreroin the <part-of-day>", -2.70805020110221),
("time-of-day (latent)in the <part-of-day>",
-2.3025850929940455)],
n = 4}}),
("de <datetime> - <datetime> (interval)",
Classifier{okData =
ClassData{prior = -infinity, unseen = -1.6094379124341003,
likelihoods = HashMap.fromList [], n = 0},
koData =
ClassData{prior = 0.0, unseen = -2.1972245773362196,
likelihoods =
HashMap.fromList
[("Diciembre<day-of-month> (ordinal or number) de <named-month>",
-1.3862943611198906),
("monthday", -1.3862943611198906),
("Diciembretime-of-day (latent)", -1.3862943611198906),
("monthhour", -1.3862943611198906)],
n = 2}}),
("<time-of-day> horas",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.6094379124341003,
likelihoods =
HashMap.fromList
[("time-of-day (latent)", -0.6931471805599453),
("hour", -0.6931471805599453)],
n = 1},
koData =
ClassData{prior = -infinity, unseen = -1.0986122886681098,
likelihoods = HashMap.fromList [], n = 0}}),
("intersect",
Classifier{okData =
ClassData{prior = -0.20585205420414873,
unseen = -4.663439094112067,
likelihoods =
HashMap.fromList
[("dayhour", -2.0149030205422647),
("Lunesin the <part-of-day>", -3.960813169597578),
("tomorrowin the <part-of-day>", -3.960813169597578),
("el <day-of-month> de <named-month>in the <part-of-day>",
-3.960813169597578),
("D\237a Internacional de las Cooperativasel <time>",
-3.960813169597578),
("hourhour", -3.044522437723423),
("now<hour-of-day> minus quarter (as relative minutes)",
-3.960813169597578),
("dayyear", -3.044522437723423),
("a las <time-of-day>in the <part-of-day>", -2.70805020110221),
("intersectin the <part-of-day>", -3.960813169597578),
("<named-month> <day-of-month>del <year>", -3.960813169597578),
("minutehour", -2.256065077359153),
("intersect by `de`in the <part-of-day>", -3.960813169597578),
("now<hour-of-day> and <relative minutes>", -3.960813169597578),
("<hour-of-day> and halfin the <part-of-day>",
-3.5553480614894135),
("tomorrowa las <time-of-day>", -3.5553480614894135),
("Miercoles<time-of-day> <part-of-day>", -3.960813169597578),
("<hour-of-day> <integer> (as relative minutes)in the <part-of-day>",
-3.960813169597578),
("Miercoles<dim time> de la manana", -3.960813169597578),
("dayminute", -3.044522437723423),
("<named-month> <day-of-month>el <time>", -3.960813169597578),
("Miercolesa las <time-of-day>", -3.960813169597578),
("el <time>in the <part-of-day>", -3.960813169597578),
("Miercolesintersect", -3.960813169597578),
("<day-of-month> (ordinal or number) de <named-month>in the <part-of-day>",
-3.960813169597578),
("nowa las <time-of-day>", -3.5553480614894135),
("D\237a Internacional de las Cooperativasdel <year>",
-3.960813169597578),
("<hour-of-day> and quarterin the <part-of-day>",
-3.044522437723423),
("yesterdayin the <part-of-day>", -3.960813169597578)],
n = 35},
koData =
ClassData{prior = -1.6817585740137264, unseen = -3.951243718581427,
likelihoods =
HashMap.fromList
[("hourday", -3.2386784521643803),
("dayhour", -2.5455312716044354),
("monthhour", -2.833213344056216),
("now<hour-of-day> and <relative minutes>",
-3.2386784521643803),
("Diciembrea las <time-of-day>", -3.2386784521643803),
("dayminute", -2.833213344056216),
("Febreroin the <part-of-day>", -3.2386784521643803),
("<day-of-month> (ordinal or number) de <named-month>a las <time-of-day>",
-3.2386784521643803),
("nowa las <time-of-day>", -2.5455312716044354),
("<time-of-day> am|pm<day-of-month> (ordinal or number) de <named-month>",
-3.2386784521643803)],
n = 8}}),
("Miercoles",
Classifier{okData =
ClassData{prior = 0.0, unseen = -2.3978952727983707,
likelihoods = HashMap.fromList [("", 0.0)], n = 9},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("a las <time-of-day>",
Classifier{okData =
ClassData{prior = -7.320340402329494e-2,
unseen = -5.135798437050262,
likelihoods =
HashMap.fromList
[("<hour-of-day> and half", -3.7436043538031827),
("<time-of-day> horas", -4.436751534363128),
("<hour-of-day> and quarter", -3.520460802488973),
("time-of-day (latent)", -1.4163266482187657),
("<hour-of-day> and <relative minutes>", -3.3381392456950185),
("<time-of-day> am|pm", -2.5649493574615367),
("<hour-of-day> minus <integer> (as relative minutes)",
-4.436751534363128),
("<hour-of-day> minus quarter (as relative minutes)",
-4.0312864262549635),
("hour", -1.3686985992295109), ("minute", -1.4923125551966876),
("<hour-of-day> <integer> (as relative minutes)",
-2.644992065135073)],
n = 79},
koData =
ClassData{prior = -2.6508917872622613,
unseen = -3.1780538303479458,
likelihoods =
HashMap.fromList
[("time-of-day (latent)", -1.5260563034950494),
("<hour-of-day> and <relative minutes>", -2.03688192726104),
("hour", -1.5260563034950494), ("minute", -2.03688192726104)],
n = 6}}),
("minutos (grain)",
Classifier{okData =
ClassData{prior = 0.0, unseen = -2.1972245773362196,
likelihoods = HashMap.fromList [("", 0.0)], n = 7},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("year (latent)",
Classifier{okData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0},
koData =
ClassData{prior = 0.0, unseen = -1.0986122886681098,
likelihoods = HashMap.fromList [("number (20..90)", 0.0)],
n = 1}}),
("Viernes",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.791759469228055,
likelihoods = HashMap.fromList [("", 0.0)], n = 4},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("el <cycle> (proximo|que viene)",
Classifier{okData =
ClassData{prior = 0.0, unseen = -2.70805020110221,
likelihoods =
HashMap.fromList
[("week", -1.540445040947149),
("semana (grain)", -1.540445040947149),
("mes (grain)", -1.9459101490553135),
("year", -1.9459101490553135),
("a\241o (grain)", -1.9459101490553135),
("month", -1.9459101490553135)],
n = 4},
koData =
ClassData{prior = -infinity, unseen = -1.9459101490553135,
likelihoods = HashMap.fromList [], n = 0}}),
("yesterday",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.3862943611198906,
likelihoods = HashMap.fromList [("", 0.0)], n = 2},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("<time-of-day> de la tarde",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.6094379124341003,
likelihoods =
HashMap.fromList
[("time-of-day (latent)number (0..15)", -0.6931471805599453),
("hour", -0.6931471805599453)],
n = 1},
koData =
ClassData{prior = -infinity, unseen = -1.0986122886681098,
likelihoods = HashMap.fromList [], n = 0}}),
("<hour-of-day> and quarter",
Classifier{okData =
ClassData{prior = 0.0, unseen = -3.0910424533583156,
likelihoods =
HashMap.fromList
[("a las <time-of-day>", -1.4350845252893227),
("time-of-day (latent)", -1.252762968495368),
("hour", -0.7419373447293773)],
n = 9},
koData =
ClassData{prior = -infinity, unseen = -1.3862943611198906,
likelihoods = HashMap.fromList [], n = 0}}),
("dentro de <duration>",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.6094379124341003,
likelihoods =
HashMap.fromList
[("<integer> <unit-of-duration>", -0.6931471805599453),
("hour", -0.6931471805599453)],
n = 1},
koData =
ClassData{prior = -infinity, unseen = -1.0986122886681098,
likelihoods = HashMap.fromList [], n = 0}}),
("hace <duration>",
Classifier{okData =
ClassData{prior = 0.0, unseen = -2.639057329615259,
likelihoods =
HashMap.fromList
[("week", -1.8718021769015913), ("year", -1.8718021769015913),
("<integer> <unit-of-duration>", -0.9555114450274363),
("hour", -1.8718021769015913), ("month", -1.8718021769015913)],
n = 4},
koData =
ClassData{prior = -infinity, unseen = -1.791759469228055,
likelihoods = HashMap.fromList [], n = 0}}),
("el <day-of-month> de <named-month>",
Classifier{okData =
ClassData{prior = 0.0, unseen = -3.4011973816621555,
likelihoods =
HashMap.fromList
[("number (0..15)Marzo", -2.6741486494265287),
("integer (numeric)Abril", -2.6741486494265287),
("number (0..15)Mayo", -2.268683541318364),
("integer (numeric)Marzo", -2.268683541318364),
("integer (numeric)Febrero", -2.6741486494265287),
("integer (numeric)Septiembre", -2.6741486494265287),
("month", -0.9694005571881036),
("integer (numeric)Mayo", -2.6741486494265287),
("integer (numeric)Julio", -2.6741486494265287)],
n = 10},
koData =
ClassData{prior = -infinity, unseen = -2.3025850929940455,
likelihoods = HashMap.fromList [], n = 0}}),
("D\237a Mundial de la Lengua \193rabe",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.3862943611198906,
likelihoods = HashMap.fromList [("", 0.0)], n = 2},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("D\237a de los Inocentes de Abril",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.791759469228055,
likelihoods = HashMap.fromList [("", 0.0)], n = 4},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("dia <day-of-month> (non ordinal)",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.6094379124341003,
likelihoods = HashMap.fromList [("number (0..15)", 0.0)], n = 3},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("el <time>",
Classifier{okData =
ClassData{prior = -2.5317807984289897e-2,
unseen = -4.543294782270004,
likelihoods =
HashMap.fromList
[("Martes", -3.4339872044851463),
("<named-month|named-day> past", -3.4339872044851463),
("dd[/-]mm", -3.146305132033365),
("intersect by `de`", -2.3353749158170367),
("<time-of-day> <part-of-day>", -3.8394523125933104),
("intersect", -3.8394523125933104),
("Miercoles", -3.4339872044851463),
("<day-of-month> (ordinal or number) de <named-month>",
-2.0476928433652555),
("Domingo", -3.4339872044851463),
("Lunes", -3.8394523125933104), ("day", -0.9490805546971459),
("year", -3.4339872044851463),
("day of month (1st)", -3.4339872044851463),
("<named-month|named-day> next", -3.8394523125933104),
("hour", -3.4339872044851463),
("this|next <day-of-week>", -3.8394523125933104)],
n = 39},
koData =
ClassData{prior = -3.6888794541139363, unseen = -2.995732273553991,
likelihoods =
HashMap.fromList
[("noon", -2.2512917986064953), ("hour", -2.2512917986064953)],
n = 1}}),
("Septiembre",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.0986122886681098,
likelihoods = HashMap.fromList [("", 0.0)], n = 1},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("<thousands> 0..999",
Classifier{okData =
ClassData{prior = -0.6931471805599453,
unseen = -1.6094379124341003,
likelihoods =
HashMap.fromList
[("1K or 1M in multipliable form<hundreds> 0..99",
-0.2876820724517809)],
n = 2},
koData =
ClassData{prior = -0.6931471805599453,
unseen = -1.6094379124341003,
likelihoods =
HashMap.fromList
[("1K or 1M in multipliable formbig number 100 to 1K",
-0.2876820724517809)],
n = 2}}),
("<day-of-month> (ordinal or number) de <named-month>",
Classifier{okData =
ClassData{prior = -8.338160893905101e-2,
unseen = -4.07753744390572,
likelihoods =
HashMap.fromList
[("ordinals (primero..10)Marzo", -2.9618307218783095),
("number (0..15)Marzo", -2.9618307218783095),
("integer (numeric)Abril", -2.9618307218783095),
("integer (numeric)Diciembre", -3.367295829986474),
("number (0..15)Mayo", -2.6741486494265287),
("integer (numeric)Enero", -3.367295829986474),
("integer (numeric)Marzo", -2.451005098112319),
("integer (numeric)Febrero", -2.268683541318364),
("integer (numeric)Septiembre", -3.367295829986474),
("month", -0.8823891801984737),
("integer (numeric)Mayo", -3.367295829986474),
("integer (numeric)Julio", -3.367295829986474)],
n = 23},
koData =
ClassData{prior = -2.5257286443082556, unseen = -2.833213344056216,
likelihoods =
HashMap.fromList
[("month", -1.6739764335716716),
("integer (numeric)Julio", -1.6739764335716716)],
n = 2}}),
("now",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.791759469228055,
likelihoods = HashMap.fromList [("", 0.0)], n = 4},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("ordinals (primero..10)",
Classifier{okData =
ClassData{prior = -1.791759469228055, unseen = -1.3862943611198906,
likelihoods = HashMap.fromList [("", 0.0)], n = 2},
koData =
ClassData{prior = -0.1823215567939546,
unseen = -2.4849066497880004,
likelihoods = HashMap.fromList [("", 0.0)], n = 10}}),
("invierno",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.0986122886681098,
likelihoods = HashMap.fromList [("", 0.0)], n = 1},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("this <part-of-day>",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.6094379124341003,
likelihoods =
HashMap.fromList
[("hour", -0.6931471805599453),
("evening", -0.6931471805599453)],
n = 1},
koData =
ClassData{prior = -infinity, unseen = -1.0986122886681098,
likelihoods = HashMap.fromList [], n = 0}}),
("number (0..15)",
Classifier{okData =
ClassData{prior = -0.13858616328614667,
unseen = -4.330733340286331,
likelihoods = HashMap.fromList [("", 0.0)], n = 74},
koData =
ClassData{prior = -2.044755983691946, unseen = -2.5649493574615367,
likelihoods = HashMap.fromList [("", 0.0)], n = 11}}),
("D\237a Internacional de las Cooperativas",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.0986122886681098,
likelihoods = HashMap.fromList [("", 0.0)], n = 1},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("Domingo",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.6094379124341003,
likelihoods = HashMap.fromList [("", 0.0)], n = 3},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("este|en un <cycle>",
Classifier{okData =
ClassData{prior = 0.0, unseen = -2.70805020110221,
likelihoods =
HashMap.fromList
[("week", -1.0296194171811581),
("semana (grain)", -1.0296194171811581),
("year", -1.9459101490553135),
("a\241o (grain)", -1.9459101490553135)],
n = 5},
koData =
ClassData{prior = -infinity, unseen = -1.6094379124341003,
likelihoods = HashMap.fromList [], n = 0}}),
("numbers prefix with -, negative or minus",
Classifier{okData =
ClassData{prior = -infinity, unseen = -1.0986122886681098,
likelihoods = HashMap.fromList [], n = 0},
koData =
ClassData{prior = 0.0, unseen = -2.4849066497880004,
likelihoods =
HashMap.fromList
[("integer (numeric)", -0.2006706954621511),
("number (0..15)", -1.7047480922384253)],
n = 9}}),
("Lunes",
Classifier{okData =
ClassData{prior = 0.0, unseen = -2.1972245773362196,
likelihoods = HashMap.fromList [("", 0.0)], n = 7},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("dd-dd <month>(interval)",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.9459101490553135,
likelihoods =
HashMap.fromList
[("Julio", -0.6931471805599453), ("month", -0.6931471805599453)],
n = 2},
koData =
ClassData{prior = -infinity, unseen = -1.0986122886681098,
likelihoods = HashMap.fromList [], n = 0}}),
("tomorrow",
Classifier{okData =
ClassData{prior = -0.12188981760903689, unseen = -4.02535169073515,
likelihoods = HashMap.fromList [("", 0.0)], n = 54},
koData =
ClassData{prior = -2.164963715117998, unseen = -2.1972245773362196,
likelihoods = HashMap.fromList [("", 0.0)], n = 7}}),
("mes (grain)",
Classifier{okData =
ClassData{prior = 0.0, unseen = -2.4849066497880004,
likelihoods = HashMap.fromList [("", 0.0)], n = 10},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("verano",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.0986122886681098,
likelihoods = HashMap.fromList [("", 0.0)], n = 1},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("number (20..90)",
Classifier{okData =
ClassData{prior = 0.0, unseen = -2.0794415416798357,
likelihoods = HashMap.fromList [("", 0.0)], n = 6},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("<day-of-week> <day-of-month>",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.6094379124341003,
likelihoods =
HashMap.fromList
[("day", -0.6931471805599453),
("Juevesinteger (numeric)", -0.6931471805599453)],
n = 1},
koData =
ClassData{prior = -infinity, unseen = -1.0986122886681098,
likelihoods = HashMap.fromList [], n = 0}}),
("fractional number",
Classifier{okData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0},
koData =
ClassData{prior = 0.0, unseen = -2.0794415416798357,
likelihoods = HashMap.fromList [("", 0.0)], n = 6}}),
("1K or 1M in multipliable form",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.3862943611198906,
likelihoods = HashMap.fromList [("", 0.0)], n = 2},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("afternoon",
Classifier{okData =
ClassData{prior = -0.2876820724517809,
unseen = -2.0794415416798357,
likelihoods = HashMap.fromList [("", 0.0)], n = 6},
koData =
ClassData{prior = -1.3862943611198906,
unseen = -1.3862943611198906,
likelihoods = HashMap.fromList [("", 0.0)], n = 2}}),
("time-of-day (latent)",
Classifier{okData =
ClassData{prior = -0.6592456288842639, unseen = -3.891820298110627,
likelihoods =
HashMap.fromList
[("integer (numeric)", -1.3062516534463542),
("number (0..15)", -0.3448404862917295)],
n = 45},
koData =
ClassData{prior = -0.7282385003712154, unseen = -3.828641396489095,
likelihoods =
HashMap.fromList
[("integer (numeric)", -1.5040773967762742),
("number (0..15)", -0.7156200364120039),
("integer (0-9) with two digits", -1.241713132308783)],
n = 42}}),
("<hour-of-day> and <relative minutes>",
Classifier{okData =
ClassData{prior = -0.3364722366212129, unseen = -3.332204510175204,
likelihoods =
HashMap.fromList
[("time-of-day (latent)number (21..29 31..39 41..49 51..59 61..69 71..79 81..89 91..99)",
-2.1972245773362196),
("time-of-day (latent)number (0..15)", -2.6026896854443837),
("a las <time-of-day>number (20..90)", -2.1972245773362196),
("a las <time-of-day>number (21..29 31..39 41..49 51..59 61..69 71..79 81..89 91..99)",
-2.1972245773362196),
("hour", -0.8979415932059586),
("a las <time-of-day>number (0..15)", -2.6026896854443837),
("time-of-day (latent)number (20..90)", -2.1972245773362196)],
n = 10},
koData =
ClassData{prior = -1.252762968495368, unseen = -2.772588722239781,
likelihoods =
HashMap.fromList
[("a las <time-of-day>number (20..90)", -1.6094379124341003),
("hour", -1.0986122886681098),
("time-of-day (latent)number (20..90)", -1.6094379124341003)],
n = 4}}),
("year",
Classifier{okData =
ClassData{prior = -0.8266785731844679,
unseen = -2.3978952727983707,
likelihoods =
HashMap.fromList
[("integer (numeric)", -0.5108256237659907),
("<thousands> 0..999", -1.2039728043259361)],
n = 7},
koData =
ClassData{prior = -0.5753641449035618,
unseen = -2.5649493574615367,
likelihoods =
HashMap.fromList
[("integer (numeric)", -0.6931471805599453),
("<thousands> 0..999", -1.3862943611198906),
("1K or 1M in multipliable form", -1.3862943611198906)],
n = 9}}),
("en <duration>",
Classifier{okData =
ClassData{prior = 0.0, unseen = -3.6635616461296463,
likelihoods =
HashMap.fromList
[("week", -2.9444389791664407), ("second", -2.9444389791664407),
("day", -2.538973871058276), ("year", -2.538973871058276),
("<integer> <unit-of-duration>", -0.8649974374866046),
("hour", -2.2512917986064953), ("month", -2.9444389791664407),
("minute", -1.845826690498331)],
n = 15},
koData =
ClassData{prior = -infinity, unseen = -2.1972245773362196,
likelihoods = HashMap.fromList [], n = 0}}),
("n <cycle> (proximo|que viene)",
Classifier{okData =
ClassData{prior = 0.0, unseen = -2.5649493574615367,
likelihoods =
HashMap.fromList
[("week", -1.791759469228055),
("integer (numeric)semana (grain)", -1.791759469228055),
("year", -1.791759469228055),
("number (0..15)mes (grain)", -1.791759469228055),
("month", -1.791759469228055),
("integer (numeric)a\241o (grain)", -1.791759469228055)],
n = 3},
koData =
ClassData{prior = -infinity, unseen = -1.9459101490553135,
likelihoods = HashMap.fromList [], n = 0}}),
("<integer> <unit-of-duration>",
Classifier{okData =
ClassData{prior = -0.587786664902119, unseen = -4.143134726391533,
likelihoods =
HashMap.fromList
[("week", -3.028522096376982),
("integer (numeric)hora (grain)", -3.4339872044851463),
("integer (numeric)dia (grain)", -3.4339872044851463),
("number (0..15)segundo (grain)", -3.4339872044851463),
("second", -3.4339872044851463),
("number (0..15)a\241o (grain)", -3.028522096376982),
("integer (numeric)minutos (grain)", -2.740840023925201),
("day", -3.028522096376982), ("year", -2.740840023925201),
("number (0..15)mes (grain)", -3.028522096376982),
("number (0..15)hora (grain)", -2.740840023925201),
("hour", -2.3353749158170367), ("month", -3.028522096376982),
("number (0..15)dia (grain)", -3.4339872044851463),
("number (0..15)minutos (grain)", -3.028522096376982),
("number (16..19 21..29)hora (grain)", -3.4339872044851463),
("minute", -2.3353749158170367),
("integer (numeric)a\241o (grain)", -3.4339872044851463),
("number (0..15)semana (grain)", -3.028522096376982)],
n = 20},
koData =
ClassData{prior = -0.8109302162163288, unseen = -4.007333185232471,
likelihoods =
HashMap.fromList
[("week", -2.890371757896165),
("integer (numeric)hora (grain)", -2.890371757896165),
("integer (numeric)dia (grain)", -2.890371757896165),
("integer (numeric)mes (grain)", -3.295836866004329),
("second", -2.890371757896165),
("number (0..15)a\241o (grain)", -3.295836866004329),
("integer (numeric)semana (grain)", -3.295836866004329),
("integer (numeric)minutos (grain)", -2.890371757896165),
("day", -2.890371757896165),
("integer (numeric)segundo (grain)", -2.890371757896165),
("year", -2.6026896854443837),
("number (0..15)mes (grain)", -2.890371757896165),
("hour", -2.890371757896165), ("month", -2.6026896854443837),
("minute", -2.890371757896165),
("integer (numeric)a\241o (grain)", -2.890371757896165),
("number (0..15)semana (grain)", -3.295836866004329)],
n = 16}}),
("proximas n <cycle>",
Classifier{okData =
ClassData{prior = 0.0, unseen = -3.2188758248682006,
likelihoods =
HashMap.fromList
[("integer (numeric)hora (grain)", -2.4849066497880004),
("integer (numeric)dia (grain)", -2.4849066497880004),
("second", -2.4849066497880004),
("number (0..15)a\241o (grain)", -2.4849066497880004),
("integer (numeric)minutos (grain)", -2.4849066497880004),
("day", -2.4849066497880004),
("integer (numeric)segundo (grain)", -2.4849066497880004),
("year", -2.4849066497880004),
("number (0..15)mes (grain)", -2.4849066497880004),
("hour", -2.4849066497880004), ("month", -2.4849066497880004),
("minute", -2.4849066497880004)],
n = 6},
koData =
ClassData{prior = -infinity, unseen = -2.5649493574615367,
likelihoods = HashMap.fromList [], n = 0}}),
("<time-of-day> am|pm",
Classifier{okData =
ClassData{prior = -0.7069405026922811, unseen = -4.356708826689592,
likelihoods =
HashMap.fromList
[("a las <time-of-day>", -1.7788560643921472),
("time-of-day (latent)", -3.6506582412937383),
("hour", -3.245193133185574), ("minute", -0.7884573603642702),
("<hour-of-day> <integer> (as relative minutes)",
-1.1657515915057381)],
n = 36},
koData =
ClassData{prior = -0.6795415285041666, unseen = -4.382026634673881,
likelihoods =
HashMap.fromList
[("time-of-day (latent)", -1.1113513144455396),
("hour", -1.1113513144455396), ("minute", -1.8044984950054848),
("<hour-of-day> <integer> (as relative minutes)",
-1.8044984950054848)],
n = 37}}),
("n proximas <cycle>",
Classifier{okData =
ClassData{prior = 0.0, unseen = -2.5649493574615367,
likelihoods =
HashMap.fromList
[("week", -1.791759469228055),
("integer (numeric)mes (grain)", -1.791759469228055),
("integer (numeric)semana (grain)", -1.791759469228055),
("year", -1.791759469228055), ("month", -1.791759469228055),
("integer (numeric)a\241o (grain)", -1.791759469228055)],
n = 3},
koData =
ClassData{prior = -infinity, unseen = -1.9459101490553135,
likelihoods = HashMap.fromList [], n = 0}}),
("ano nuevo",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.3862943611198906,
likelihoods = HashMap.fromList [("", 0.0)], n = 2},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("la <cycle> pasado",
Classifier{okData =
ClassData{prior = 0.0, unseen = -2.3978952727983707,
likelihoods =
HashMap.fromList
[("week", -1.2039728043259361),
("semana (grain)", -1.2039728043259361),
("year", -1.6094379124341003),
("a\241o (grain)", -1.6094379124341003)],
n = 3},
koData =
ClassData{prior = -infinity, unseen = -1.6094379124341003,
likelihoods = HashMap.fromList [], n = 0}}),
("la pasado <cycle>",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.6094379124341003,
likelihoods =
HashMap.fromList
[("mes (grain)", -0.6931471805599453),
("month", -0.6931471805599453)],
n = 1},
koData =
ClassData{prior = -infinity, unseen = -1.0986122886681098,
likelihoods = HashMap.fromList [], n = 0}}),
("number (21..29 31..39 41..49 51..59 61..69 71..79 81..89 91..99)",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.3862943611198906,
likelihoods =
HashMap.fromList [("number (20..90)number (0..15)", 0.0)],
n = 2},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("day of month (1st)",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.791759469228055,
likelihoods = HashMap.fromList [("", 0.0)], n = 4},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("Sabado",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.0986122886681098,
likelihoods = HashMap.fromList [("", 0.0)], n = 1},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("Diciembre",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.0986122886681098,
likelihoods = HashMap.fromList [("", 0.0)], n = 1},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("D\237a de la Cero Discriminaci\243n",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.3862943611198906,
likelihoods = HashMap.fromList [("", 0.0)], n = 2},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("a\241o (grain)",
Classifier{okData =
ClassData{prior = 0.0, unseen = -2.639057329615259,
likelihoods = HashMap.fromList [("", 0.0)], n = 12},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("Julio",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.6094379124341003,
likelihoods = HashMap.fromList [("", 0.0)], n = 3},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("<hundreds> 0..99",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.3862943611198906,
likelihoods =
HashMap.fromList [("big number 100 to 1Knumber (20..90)", 0.0)],
n = 2},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("<hour-of-day> minus <integer> (as relative minutes)",
Classifier{okData =
ClassData{prior = 0.0, unseen = -2.0794415416798357,
likelihoods =
HashMap.fromList
[("time-of-day (latent)number (0..15)", -1.252762968495368),
("hour", -0.8472978603872037),
("a las <time-of-day>number (0..15)", -1.252762968495368)],
n = 2},
koData =
ClassData{prior = -infinity, unseen = -1.3862943611198906,
likelihoods = HashMap.fromList [], n = 0}}),
("<named-month|named-day> next",
Classifier{okData =
ClassData{prior = 0.0, unseen = -2.3978952727983707,
likelihoods =
HashMap.fromList
[("Martes", -1.6094379124341003),
("Miercoles", -1.6094379124341003),
("el <time>", -1.6094379124341003),
("day", -0.916290731874155)],
n = 3},
koData =
ClassData{prior = -infinity, unseen = -1.6094379124341003,
likelihoods = HashMap.fromList [], n = 0}}),
("number (16..19 21..29)",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.0986122886681098,
likelihoods = HashMap.fromList [("", 0.0)], n = 1},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("<dim time> de la tarde",
Classifier{okData =
ClassData{prior = -5.406722127027582e-2,
unseen = -3.784189633918261,
likelihoods =
HashMap.fromList
[("<hour-of-day> and half", -2.662587827025453),
("a las <time-of-day>", -1.6817585740137264),
("<hour-of-day> and quarter", -2.151762203259462),
("time-of-day (latent)", -2.151762203259462),
("hour", -1.563975538357343), ("minute", -1.363304842895192),
("<hour-of-day> <integer> (as relative minutes)",
-3.068052935133617)],
n = 18},
koData =
ClassData{prior = -2.9444389791664407,
unseen = -2.3025850929940455,
likelihoods =
HashMap.fromList
[("time-of-day (latent)", -1.5040773967762742),
("hour", -1.5040773967762742)],
n = 1}}),
("el proximo <cycle> ",
Classifier{okData =
ClassData{prior = 0.0, unseen = -2.70805020110221,
likelihoods =
HashMap.fromList
[("week", -1.540445040947149),
("semana (grain)", -1.540445040947149),
("mes (grain)", -1.9459101490553135),
("year", -1.9459101490553135),
("a\241o (grain)", -1.9459101490553135),
("month", -1.9459101490553135)],
n = 4},
koData =
ClassData{prior = -infinity, unseen = -1.9459101490553135,
likelihoods = HashMap.fromList [], n = 0}}),
("<hour-of-day> minus quarter (as relative minutes)",
Classifier{okData =
ClassData{prior = 0.0, unseen = -2.4849066497880004,
likelihoods =
HashMap.fromList
[("a las <time-of-day>", -1.2992829841302609),
("time-of-day (latent)", -1.2992829841302609),
("hour", -0.7884573603642702)],
n = 4},
koData =
ClassData{prior = -infinity, unseen = -1.3862943611198906,
likelihoods = HashMap.fromList [], n = 0}}),
("the day after tomorrow",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.0986122886681098,
likelihoods = HashMap.fromList [("", 0.0)], n = 1},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("del <year>",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.3862943611198906,
likelihoods = HashMap.fromList [("integer (numeric)", 0.0)],
n = 2},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("dd[/-.]mm[/-.]yyyy",
Classifier{okData =
ClassData{prior = 0.0, unseen = -2.0794415416798357,
likelihoods = HashMap.fromList [("", 0.0)], n = 6},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("noon",
Classifier{okData =
ClassData{prior = -0.2876820724517809,
unseen = -1.6094379124341003,
likelihoods = HashMap.fromList [("", 0.0)], n = 3},
koData =
ClassData{prior = -1.3862943611198906,
unseen = -1.0986122886681098,
likelihoods = HashMap.fromList [("", 0.0)], n = 1}}),
("evening",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.791759469228055,
likelihoods = HashMap.fromList [("", 0.0)], n = 4},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("Febrero",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.9459101490553135,
likelihoods = HashMap.fromList [("", 0.0)], n = 5},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("next week",
Classifier{okData =
ClassData{prior = -0.40546510810816444,
unseen = -1.9459101490553135,
likelihoods =
HashMap.fromList
[("week", -0.6931471805599453),
("semana (grain)", -0.6931471805599453)],
n = 2},
koData =
ClassData{prior = -1.0986122886681098,
unseen = -1.6094379124341003,
likelihoods =
HashMap.fromList
[("week", -0.6931471805599453),
("semana (grain)", -0.6931471805599453)],
n = 1}}),
("<datetime> - <datetime> (interval)",
Classifier{okData =
ClassData{prior = -0.916290731874155, unseen = -2.5649493574615367,
likelihoods =
HashMap.fromList
[("minuteminute", -1.791759469228055),
("dayday", -1.791759469228055),
("hh(:|.|h)mm (time-of-day)hh(:|.|h)mm (time-of-day)",
-1.791759469228055),
("<day-of-month> (ordinal or number) de <named-month><day-of-month> (ordinal or number) de <named-month>",
-1.791759469228055)],
n = 2},
koData =
ClassData{prior = -0.5108256237659907, unseen = -2.70805020110221,
likelihoods =
HashMap.fromList
[("Diciembre<day-of-month> (ordinal or number) de <named-month>",
-1.9459101490553135),
("monthday", -1.9459101490553135),
("dayyear", -1.540445040947149),
("dd[/-]mmyear", -1.540445040947149)],
n = 3}}),
("Enero",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.0986122886681098,
likelihoods = HashMap.fromList [("", 0.0)], n = 1},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("el <day-of-month> (non ordinal)",
Classifier{okData =
ClassData{prior = -6.453852113757118e-2,
unseen = -2.890371757896165,
likelihoods =
HashMap.fromList
[("integer (numeric)", -0.2682639865946794),
("number (0..15)", -1.4469189829363254)],
n = 15},
koData =
ClassData{prior = -2.772588722239781, unseen = -1.3862943611198906,
likelihoods =
HashMap.fromList [("integer (numeric)", -0.40546510810816444)],
n = 1}}),
("segundo (grain)",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.6094379124341003,
likelihoods = HashMap.fromList [("", 0.0)], n = 3},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("next week (alt)",
Classifier{okData =
ClassData{prior = -0.3364722366212129,
unseen = -2.5649493574615367,
likelihoods =
HashMap.fromList
[("week", -0.6931471805599453),
("semana (grain)", -0.6931471805599453)],
n = 5},
koData =
ClassData{prior = -1.252762968495368, unseen = -1.9459101490553135,
likelihoods =
HashMap.fromList
[("week", -0.6931471805599453),
("semana (grain)", -0.6931471805599453)],
n = 2}}),
("Marzo",
Classifier{okData =
ClassData{prior = 0.0, unseen = -2.4849066497880004,
likelihoods = HashMap.fromList [("", 0.0)], n = 10},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("<named-month> <day-of-month>",
Classifier{okData =
ClassData{prior = 0.0, unseen = -2.3978952727983707,
likelihoods =
HashMap.fromList
[("Marzointeger (numeric)", -1.6094379124341003),
("Abrilinteger (numeric)", -1.6094379124341003),
("month", -0.916290731874155),
("Mayointeger (numeric)", -1.6094379124341003)],
n = 3},
koData =
ClassData{prior = -infinity, unseen = -1.6094379124341003,
likelihoods = HashMap.fromList [], n = 0}}),
("dia (grain)",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.791759469228055,
likelihoods = HashMap.fromList [("", 0.0)], n = 4},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("in the <part-of-day>",
Classifier{okData =
ClassData{prior = -0.2682639865946794,
unseen = -3.4339872044851463,
likelihoods =
HashMap.fromList
[("afternoon", -1.455287232606842),
("hour", -0.7621400520468967), ("evening", -2.0149030205422647),
("morning", -1.791759469228055)],
n = 13},
koData =
ClassData{prior = -1.4469189829363254,
unseen = -2.5649493574615367,
likelihoods =
HashMap.fromList
[("afternoon", -1.3862943611198906),
("hour", -0.8754687373538999),
("morning", -1.3862943611198906)],
n = 4}}),
("this|next <day-of-week>",
Classifier{okData =
ClassData{prior = 0.0, unseen = -2.3025850929940455,
likelihoods =
HashMap.fromList
[("Viernes", -1.0986122886681098),
("Lunes", -1.5040773967762742), ("day", -0.8109302162163288)],
n = 3},
koData =
ClassData{prior = -infinity, unseen = -1.3862943611198906,
likelihoods = HashMap.fromList [], n = 0}}),
("morning",
Classifier{okData =
ClassData{prior = -0.40546510810816444,
unseen = -1.791759469228055,
likelihoods = HashMap.fromList [("", 0.0)], n = 4},
koData =
ClassData{prior = -1.0986122886681098,
unseen = -1.3862943611198906,
likelihoods = HashMap.fromList [("", 0.0)], n = 2}}),
("week-end",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.3862943611198906,
likelihoods = HashMap.fromList [("", 0.0)], n = 2},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("Nochevieja",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.0986122886681098,
likelihoods = HashMap.fromList [("", 0.0)], n = 1},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("year (value by adding three composing numbers together)",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.3862943611198906,
likelihoods =
HashMap.fromList [("big number 100 to 1Knumber (20..90)", 0.0)],
n = 2},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("hora (grain)",
Classifier{okData =
ClassData{prior = -0.15415067982725836,
unseen = -2.0794415416798357,
likelihoods = HashMap.fromList [("", 0.0)], n = 6},
koData =
ClassData{prior = -1.9459101490553135,
unseen = -1.0986122886681098,
likelihoods = HashMap.fromList [("", 0.0)], n = 1}}),
("right now",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.791759469228055,
likelihoods = HashMap.fromList [("", 0.0)], n = 4},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("Navidad",
Classifier{okData =
ClassData{prior = 0.0, unseen = -1.3862943611198906,
likelihoods = HashMap.fromList [("", 0.0)], n = 2},
koData =
ClassData{prior = -infinity, unseen = -0.6931471805599453,
likelihoods = HashMap.fromList [], n = 0}}),
("<hour-of-day> <integer> (as relative minutes)",
Classifier{okData =
ClassData{prior = -0.40546510810816444,
unseen = -3.9889840465642745,
likelihoods =
HashMap.fromList
[("a las <time-of-day>integer (0-9) with two digits",
-1.4853852637641216),
("time-of-day (latent)integer (0-9) with two digits",
-1.405342556090585),
("time-of-day (latent)number (0..15)", -3.2771447329921766),
("hour", -0.7514160886839211)],
n = 24},
koData =
ClassData{prior = -1.0986122886681098,
unseen = -3.4011973816621555,
likelihoods =
HashMap.fromList
[("time-of-day (latent)integer (numeric)", -1.9810014688665833),
("time-of-day (latent)number (0..15)", -1.0647107369924282),
("hour", -0.8023464725249373)],
n = 12}}),
("integer (0-9) with two digits",
Classifier{okData =
ClassData{prior = 0.0, unseen = -2.70805020110221,
likelihoods =
HashMap.fromList
[("integer (numeric)", -1.252762968495368),
("number (0..15)", -0.3364722366212129)],
n = 12},
koData =
ClassData{prior = -infinity, unseen = -1.0986122886681098,
likelihoods = HashMap.fromList [], n = 0}}),
("ce <time>",
Classifier{okData =
ClassData{prior = 0.0, unseen = -2.833213344056216,
likelihoods =
HashMap.fromList
[("invierno", -2.0794415416798357),
("Lunes", -2.0794415416798357), ("verano", -2.0794415416798357),
("day", -1.3862943611198906), ("hour", -1.6739764335716716),
("week-end", -1.6739764335716716)],
n = 5},
koData =
ClassData{prior = -infinity, unseen = -1.9459101490553135,
likelihoods = HashMap.fromList [], n = 0}})] | 88,624 | false | true | 0 | 15 | 43,219 | 16,102 | 10,007 | 6,095 | null | null |
LightAndLight/hindley-milner | src/Phil/Core/AST/Lens.hs | bsd-3-clause | _Lit' :: Literal -> Prism' Expr ()
_Lit' = only . Lit | 53 | _Lit' :: Literal -> Prism' Expr ()
_Lit' = only . Lit | 53 | _Lit' = only . Lit | 18 | false | true | 0 | 7 | 11 | 26 | 13 | 13 | null | null |
ony/hledger | hledger-lib/Hledger/Query.hs | gpl-3.0 | compareMaybeDates (Just _) Nothing = GT | 39 | compareMaybeDates (Just _) Nothing = GT | 39 | compareMaybeDates (Just _) Nothing = GT | 39 | false | false | 1 | 6 | 5 | 19 | 8 | 11 | null | null |
bfpg/talks | site.hs | cc0-1.0 | -- Replace YYYY-MM-DD- with YYYY-MM-DD. to keep URLs consistent
rewriteTalkUrl :: FilePath -> FilePath
rewriteTalkUrl s =
intercalate "-" (take 3 splitUrl) ++ "." ++ intercalate "-" (drop 3 splitUrl)
where
splitUrl = splitAll "-" s | 239 | rewriteTalkUrl :: FilePath -> FilePath
rewriteTalkUrl s =
intercalate "-" (take 3 splitUrl) ++ "." ++ intercalate "-" (drop 3 splitUrl)
where
splitUrl = splitAll "-" s | 175 | rewriteTalkUrl s =
intercalate "-" (take 3 splitUrl) ++ "." ++ intercalate "-" (drop 3 splitUrl)
where
splitUrl = splitAll "-" s | 136 | true | true | 0 | 9 | 43 | 66 | 32 | 34 | null | null |
Helkafen/haddock | haddock-api/src/Haddock/Backends/LaTeX.hs | bsd-2-clause | string_txt (ZStr s1) s2 = zString s1 ++ s2 | 42 | string_txt (ZStr s1) s2 = zString s1 ++ s2 | 42 | string_txt (ZStr s1) s2 = zString s1 ++ s2 | 42 | false | false | 0 | 7 | 8 | 24 | 11 | 13 | null | null |
chemouna/99Haskell | src/Problem12.hs | bsd-3-clause | decodeModified5 :: [ListItem a] -> [a]
decodeModified5 = foldl (\acc e -> case e of Single x -> acc ++ [x]; Multiple n x -> acc ++ replicate n x) [] | 148 | decodeModified5 :: [ListItem a] -> [a]
decodeModified5 = foldl (\acc e -> case e of Single x -> acc ++ [x]; Multiple n x -> acc ++ replicate n x) [] | 148 | decodeModified5 = foldl (\acc e -> case e of Single x -> acc ++ [x]; Multiple n x -> acc ++ replicate n x) [] | 109 | false | true | 0 | 12 | 30 | 82 | 42 | 40 | null | null |
vikraman/ghc | compiler/prelude/THNames.hs | bsd-3-clause | dataInstDName = libFun (fsLit "dataInstD") dataInstDIdKey | 72 | dataInstDName = libFun (fsLit "dataInstD") dataInstDIdKey | 72 | dataInstDName = libFun (fsLit "dataInstD") dataInstDIdKey | 72 | false | false | 0 | 7 | 20 | 17 | 8 | 9 | null | null |
music-suite/music-score | src/Music/Score/Meta/Title.hs | bsd-3-clause | getTitleAt :: Title -> Int -> Maybe String
getTitleAt (Title t) n = fmap getLast . getOption . t $ n | 100 | getTitleAt :: Title -> Int -> Maybe String
getTitleAt (Title t) n = fmap getLast . getOption . t $ n | 100 | getTitleAt (Title t) n = fmap getLast . getOption . t $ n | 57 | false | true | 0 | 8 | 20 | 48 | 23 | 25 | null | null |
Icelandjack/lens | src/Control/Lens/Fold.hs | bsd-3-clause | -- | A 'Fold' over the individual 'words' of a 'String'.
--
-- @
-- 'worded' :: 'Fold' 'String' 'String'
-- 'worded' :: 'Traversal'' 'String' 'String'
-- @
--
-- @
-- 'worded' :: 'IndexedFold' 'Int' 'String' 'String'
-- 'worded' :: 'IndexedTraversal'' 'Int' 'String' 'String'
-- @
--
-- Note: This function type-checks as a 'Traversal' but it doesn't satisfy the laws. It's only valid to use it
-- when you don't insert any whitespace characters while traversing, and if your original 'String' contains only
-- isolated space characters (and no other characters that count as space, such as non-breaking spaces).
worded :: Applicative f => IndexedLensLike' Int f String String
worded f = fmap unwords . conjoined traverse (indexing traverse) f . words | 751 | worded :: Applicative f => IndexedLensLike' Int f String String
worded f = fmap unwords . conjoined traverse (indexing traverse) f . words | 138 | worded f = fmap unwords . conjoined traverse (indexing traverse) f . words | 74 | true | true | 1 | 8 | 123 | 77 | 41 | 36 | null | null |
christiaanb/ghc | compiler/cmm/CmmUtils.hs | bsd-3-clause | cmmAddWord dflags e1 e2 = CmmMachOp (mo_wordAdd dflags) [e1, e2] | 64 | cmmAddWord dflags e1 e2 = CmmMachOp (mo_wordAdd dflags) [e1, e2] | 64 | cmmAddWord dflags e1 e2 = CmmMachOp (mo_wordAdd dflags) [e1, e2] | 64 | false | false | 0 | 7 | 9 | 30 | 15 | 15 | null | null |
wavewave/HROOT-generate | HROOT-generate/lib/HROOT/Data/RooFit/RooStats/Class.hs | gpl-3.0 | ratioOfProfiledLikelihoodsTestStat :: Class
ratioOfProfiledLikelihoodsTestStat =
roostatsclass "RatioOfProfiledLikelihoodsTestStat" [testStatistic]
[] | 154 | ratioOfProfiledLikelihoodsTestStat :: Class
ratioOfProfiledLikelihoodsTestStat =
roostatsclass "RatioOfProfiledLikelihoodsTestStat" [testStatistic]
[] | 154 | ratioOfProfiledLikelihoodsTestStat =
roostatsclass "RatioOfProfiledLikelihoodsTestStat" [testStatistic]
[] | 110 | false | true | 0 | 6 | 12 | 24 | 12 | 12 | null | null |
JanAhrens/xing-api-haskell | lib/Web/XING/Types/User/FullUser.hs | bsd-3-clause | haves = _haves | 22 | haves = _haves | 22 | haves = _haves | 22 | false | false | 1 | 5 | 10 | 10 | 3 | 7 | null | null |
kumasento/accelerate-cuda | Data/Array/Accelerate/CUDA/CodeGen.hs | bsd-3-clause | prj (SuccIdx ix) (Push val _) = prj ix val | 42 | prj (SuccIdx ix) (Push val _) = prj ix val | 42 | prj (SuccIdx ix) (Push val _) = prj ix val | 42 | false | false | 1 | 7 | 9 | 32 | 14 | 18 | null | null |
pack-it-forms/msgfmt | src/PackItForms/ICS213.hs | apache-2.0 | isICS213Field :: String -> Bool
isICS213Field k = k `elem` headerFields || k `elem` footerFields | 96 | isICS213Field :: String -> Bool
isICS213Field k = k `elem` headerFields || k `elem` footerFields | 96 | isICS213Field k = k `elem` headerFields || k `elem` footerFields | 64 | false | true | 0 | 7 | 14 | 34 | 19 | 15 | null | null |
QuickChick/Luck | luck/src/Common/Conversions.hs | mit | -- Conj always does e1 first.
-- Users can use "and" instead to explicitly control this
convertExp l (O.Conj e1 e2) = do
s <- get
-- fid <- lookupVar $ vrRev s ! "and"
e1' <- convertExp l e1
e2' <- convertExp l e2
trueCon <- lookupCon "True"
falseCon <- lookupCon "False"
return $ andMacro trueCon falseCon e1' e2'
--I.Call fid [I.ADT trueCon [], I.Lit 1, I.Lit 1, e1', e2']
-- Disjunction generates a fresh unknown for choosing a branch
-- Users can use "or" instead to explicitly control this | 520 | convertExp l (O.Conj e1 e2) = do
s <- get
-- fid <- lookupVar $ vrRev s ! "and"
e1' <- convertExp l e1
e2' <- convertExp l e2
trueCon <- lookupCon "True"
falseCon <- lookupCon "False"
return $ andMacro trueCon falseCon e1' e2'
--I.Call fid [I.ADT trueCon [], I.Lit 1, I.Lit 1, e1', e2']
-- Disjunction generates a fresh unknown for choosing a branch
-- Users can use "or" instead to explicitly control this | 431 | convertExp l (O.Conj e1 e2) = do
s <- get
-- fid <- lookupVar $ vrRev s ! "and"
e1' <- convertExp l e1
e2' <- convertExp l e2
trueCon <- lookupCon "True"
falseCon <- lookupCon "False"
return $ andMacro trueCon falseCon e1' e2'
--I.Call fid [I.ADT trueCon [], I.Lit 1, I.Lit 1, e1', e2']
-- Disjunction generates a fresh unknown for choosing a branch
-- Users can use "or" instead to explicitly control this | 431 | true | false | 0 | 8 | 116 | 94 | 44 | 50 | null | null |
khibino/haskell-debian-build.rebuild | src/Debian/Package/Build/Command.hs | bsd-3-clause | system' :: String -> Trace ()
system' cmd = do
traceCommand cmd
lift $ Process.system cmd >>= handleExit cmd
-- | Change directory action | 142 | system' :: String -> Trace ()
system' cmd = do
traceCommand cmd
lift $ Process.system cmd >>= handleExit cmd
-- | Change directory action | 142 | system' cmd = do
traceCommand cmd
lift $ Process.system cmd >>= handleExit cmd
-- | Change directory action | 112 | false | true | 0 | 10 | 28 | 49 | 22 | 27 | null | null |
hferreiro/replay | compiler/nativeGen/X86/CodeGen.hs | bsd-3-clause | getCondCode other = pprPanic "getCondCode(2)(x86,x86_64)" (ppr other) | 69 | getCondCode other = pprPanic "getCondCode(2)(x86,x86_64)" (ppr other) | 69 | getCondCode other = pprPanic "getCondCode(2)(x86,x86_64)" (ppr other) | 69 | false | false | 1 | 7 | 6 | 23 | 9 | 14 | null | null |
rueshyna/gogol | gogol-logging/gen/Network/Google/Resource/Logging/Organizations/Sinks/Get.hs | mpl-2.0 | -- | JSONP
osgCallback :: Lens' OrganizationsSinksGet (Maybe Text)
osgCallback
= lens _osgCallback (\ s a -> s{_osgCallback = a}) | 131 | osgCallback :: Lens' OrganizationsSinksGet (Maybe Text)
osgCallback
= lens _osgCallback (\ s a -> s{_osgCallback = a}) | 120 | osgCallback
= lens _osgCallback (\ s a -> s{_osgCallback = a}) | 64 | true | true | 1 | 9 | 21 | 50 | 25 | 25 | null | null |
caiorss/Functional-Programming | haskell/rwh/ch05/SimpleJSON2.hs | unlicense | getString :: JValue -> Maybe String
getString (JString s) = Just s | 67 | getString :: JValue -> Maybe String
getString (JString s) = Just s | 66 | getString (JString s) = Just s | 30 | false | true | 0 | 7 | 12 | 30 | 14 | 16 | null | null |
oldmanmike/ghc | compiler/types/Coercion.hs | bsd-3-clause | seqCo (SymCo co) = seqCo co | 42 | seqCo (SymCo co) = seqCo co | 42 | seqCo (SymCo co) = seqCo co | 42 | false | false | 0 | 7 | 20 | 18 | 8 | 10 | null | null |
phadej/psqueues | src/Data/HashPSQ/Internal.hs | bsd-3-clause | keys :: (Hashable k, Ord k, Ord p) => HashPSQ k p v -> [k]
keys t = [k | (k, _, _) <- toList t] | 95 | keys :: (Hashable k, Ord k, Ord p) => HashPSQ k p v -> [k]
keys t = [k | (k, _, _) <- toList t] | 95 | keys t = [k | (k, _, _) <- toList t] | 36 | false | true | 0 | 8 | 25 | 72 | 38 | 34 | null | null |
SavinaRoja/SavinaRoja.github.io | assets/centraldogma_algebraic.hs | mit | charToNuc x = error $ x:" is not a valid nucleotide character" | 64 | charToNuc x = error $ x:" is not a valid nucleotide character" | 64 | charToNuc x = error $ x:" is not a valid nucleotide character" | 64 | false | false | 0 | 6 | 13 | 17 | 8 | 9 | null | null |
tmhedberg/hsenv | src/Actions.hs | bsd-3-clause | symlinkToSkeleton :: String -- ^ Name of skeleton
-> String -- ^ Name of link
-> Hsenv ()
symlinkToSkeleton skel link = do
dirStructure <- hseDirStructure
let prependBinDir = (hsEnvBinDir dirStructure </>)
liftIO $ createSymbolicLink (prependBinDir skel) (prependBinDir link) | 323 | symlinkToSkeleton :: String -- ^ Name of skeleton
-> String -- ^ Name of link
-> Hsenv ()
symlinkToSkeleton skel link = do
dirStructure <- hseDirStructure
let prependBinDir = (hsEnvBinDir dirStructure </>)
liftIO $ createSymbolicLink (prependBinDir skel) (prependBinDir link) | 323 | symlinkToSkeleton skel link = do
dirStructure <- hseDirStructure
let prependBinDir = (hsEnvBinDir dirStructure </>)
liftIO $ createSymbolicLink (prependBinDir skel) (prependBinDir link) | 197 | false | true | 0 | 11 | 86 | 78 | 38 | 40 | null | null |
romanb/amazonka | amazonka-elasticbeanstalk/gen/Network/AWS/ElasticBeanstalk/Types.hs | mpl-2.0 | -- | The name of the launch configuration.
lcName :: Lens' LaunchConfiguration (Maybe Text)
lcName = lens _lcName (\s a -> s { _lcName = a }) | 141 | lcName :: Lens' LaunchConfiguration (Maybe Text)
lcName = lens _lcName (\s a -> s { _lcName = a }) | 98 | lcName = lens _lcName (\s a -> s { _lcName = a }) | 49 | true | true | 0 | 9 | 26 | 46 | 25 | 21 | null | null |
philipcraig/hutton | src/Exercises/Machine.hs | bsd-3-clause | exec (MULT n:c) m = exec c (n * m) | 34 | exec (MULT n:c) m = exec c (n * m) | 34 | exec (MULT n:c) m = exec c (n * m) | 34 | false | false | 0 | 8 | 9 | 33 | 16 | 17 | null | null |
GaloisInc/halvm-ghc | compiler/llvmGen/LlvmMangler.hs | bsd-3-clause | replaceOnce :: B.ByteString -> B.ByteString -> B.ByteString -> B.ByteString
replaceOnce matchBS replaceOnceBS = loop
where
loop :: B.ByteString -> B.ByteString
loop cts =
case B.breakSubstring matchBS cts of
(hd,tl) | B.null tl -> hd
| otherwise -> hd `B.append` replaceOnceBS `B.append`
B.drop (B.length matchBS) tl
-- | This function splits a line of assembly code into the label and the
-- rest of the code. | 490 | replaceOnce :: B.ByteString -> B.ByteString -> B.ByteString -> B.ByteString
replaceOnce matchBS replaceOnceBS = loop
where
loop :: B.ByteString -> B.ByteString
loop cts =
case B.breakSubstring matchBS cts of
(hd,tl) | B.null tl -> hd
| otherwise -> hd `B.append` replaceOnceBS `B.append`
B.drop (B.length matchBS) tl
-- | This function splits a line of assembly code into the label and the
-- rest of the code. | 490 | replaceOnce matchBS replaceOnceBS = loop
where
loop :: B.ByteString -> B.ByteString
loop cts =
case B.breakSubstring matchBS cts of
(hd,tl) | B.null tl -> hd
| otherwise -> hd `B.append` replaceOnceBS `B.append`
B.drop (B.length matchBS) tl
-- | This function splits a line of assembly code into the label and the
-- rest of the code. | 414 | false | true | 0 | 13 | 144 | 136 | 69 | 67 | null | null |
scslab/appdeploy | src/Deploy/Controller.hs | bsd-3-clause | -- stores a ControllerState along with every action
removeDeployer :: DeployerId -> MVar () -> MVar Int -> MVar () -> Controller ()
removeDeployer did depMutex jobMutex nginxMutex = do
deployers <- gets ctrlDeployers
jobht <- gets ctrlJobs
md <- liftIO $ stToIO $ do
md <- HST.lookup deployers did -- the mvar deployer
when (isJust md) $ HST.delete deployers did -- deployer exists, so delete it from ht
return md
when (isJust md) $ do
joblist <- liftIO $ H.toList jobht
flip mapM joblist $ \(job, mdep) -> -- re-deploy jobs
if mdep == (fromJust md) then deployJob job jobMutex nginxMutex
else return ""
liftIO $ do
updateDeployerFile deployers deployerFile depMutex -- update the file backup
withMVar (fromJust md) deployerClose -- close the handle
return () | 843 | removeDeployer :: DeployerId -> MVar () -> MVar Int -> MVar () -> Controller ()
removeDeployer did depMutex jobMutex nginxMutex = do
deployers <- gets ctrlDeployers
jobht <- gets ctrlJobs
md <- liftIO $ stToIO $ do
md <- HST.lookup deployers did -- the mvar deployer
when (isJust md) $ HST.delete deployers did -- deployer exists, so delete it from ht
return md
when (isJust md) $ do
joblist <- liftIO $ H.toList jobht
flip mapM joblist $ \(job, mdep) -> -- re-deploy jobs
if mdep == (fromJust md) then deployJob job jobMutex nginxMutex
else return ""
liftIO $ do
updateDeployerFile deployers deployerFile depMutex -- update the file backup
withMVar (fromJust md) deployerClose -- close the handle
return () | 790 | removeDeployer did depMutex jobMutex nginxMutex = do
deployers <- gets ctrlDeployers
jobht <- gets ctrlJobs
md <- liftIO $ stToIO $ do
md <- HST.lookup deployers did -- the mvar deployer
when (isJust md) $ HST.delete deployers did -- deployer exists, so delete it from ht
return md
when (isJust md) $ do
joblist <- liftIO $ H.toList jobht
flip mapM joblist $ \(job, mdep) -> -- re-deploy jobs
if mdep == (fromJust md) then deployJob job jobMutex nginxMutex
else return ""
liftIO $ do
updateDeployerFile deployers deployerFile depMutex -- update the file backup
withMVar (fromJust md) deployerClose -- close the handle
return () | 710 | true | true | 0 | 15 | 210 | 260 | 120 | 140 | null | null |
mkeeter/spacewar | Game/Spacewar/Actors.hs | mit | isPresent :: Ship -> Bool
isPresent (Ship _ _ _ _) = True | 57 | isPresent :: Ship -> Bool
isPresent (Ship _ _ _ _) = True | 57 | isPresent (Ship _ _ _ _) = True | 31 | false | true | 0 | 7 | 12 | 30 | 15 | 15 | null | null |
OS2World/DEV-UTIL-HUGS | libraries/Data/Array/Storable.hs | bsd-3-clause | withStorableArray :: StorableArray i e -> (Ptr e -> IO a) -> IO a
withStorableArray (StorableArray _ _ fp) f = withForeignPtr fp f | 130 | withStorableArray :: StorableArray i e -> (Ptr e -> IO a) -> IO a
withStorableArray (StorableArray _ _ fp) f = withForeignPtr fp f | 130 | withStorableArray (StorableArray _ _ fp) f = withForeignPtr fp f | 64 | false | true | 0 | 9 | 23 | 60 | 28 | 32 | null | null |
tomlokhorst/language-cil | examples/02_Arith.hs | bsd-3-clause | ass :: Assembly
ass = Assembly [mscorlibRef] "Example" [hello] | 62 | ass :: Assembly
ass = Assembly [mscorlibRef] "Example" [hello] | 62 | ass = Assembly [mscorlibRef] "Example" [hello] | 46 | false | true | 0 | 6 | 8 | 31 | 14 | 17 | null | null |
thomie/cabal | cabal-install/Distribution/Client/Setup.hs | bsd-3-clause | optionSolver :: (flags -> Flag PreSolver)
-> (Flag PreSolver -> flags -> flags)
-> OptionField flags
optionSolver get set =
option [] ["solver"]
("Select dependency solver to use (default: " ++ display defaultSolver ++ "). Choices: " ++ allSolvers ++ ", where 'choose' chooses between 'topdown' and 'modular' based on compiler version.")
get set
(reqArg "SOLVER" (readP_to_E (const $ "solver must be one of: " ++ allSolvers)
(toFlag `fmap` parse))
(flagToList . fmap display)) | 570 | optionSolver :: (flags -> Flag PreSolver)
-> (Flag PreSolver -> flags -> flags)
-> OptionField flags
optionSolver get set =
option [] ["solver"]
("Select dependency solver to use (default: " ++ display defaultSolver ++ "). Choices: " ++ allSolvers ++ ", where 'choose' chooses between 'topdown' and 'modular' based on compiler version.")
get set
(reqArg "SOLVER" (readP_to_E (const $ "solver must be one of: " ++ allSolvers)
(toFlag `fmap` parse))
(flagToList . fmap display)) | 570 | optionSolver get set =
option [] ["solver"]
("Select dependency solver to use (default: " ++ display defaultSolver ++ "). Choices: " ++ allSolvers ++ ", where 'choose' chooses between 'topdown' and 'modular' based on compiler version.")
get set
(reqArg "SOLVER" (readP_to_E (const $ "solver must be one of: " ++ allSolvers)
(toFlag `fmap` parse))
(flagToList . fmap display)) | 443 | false | true | 0 | 11 | 167 | 143 | 71 | 72 | null | null |
ComputationWithBoundedResources/ara-inference | src/Data/Rewriting/ARA/ByInferenceRules/Vector/Type.hs | mit | vector0FromVectorInstance Vector4{} = Vector4 0 0 0 0 | 53 | vector0FromVectorInstance Vector4{} = Vector4 0 0 0 0 | 53 | vector0FromVectorInstance Vector4{} = Vector4 0 0 0 0 | 53 | false | false | 0 | 5 | 7 | 23 | 10 | 13 | null | null |
vTurbine/ghc | compiler/typecheck/TcType.hs | bsd-3-clause | pprTcTyVarDetails (SkolemTv False) = text "sk" | 46 | pprTcTyVarDetails (SkolemTv False) = text "sk" | 46 | pprTcTyVarDetails (SkolemTv False) = text "sk" | 46 | false | false | 0 | 7 | 5 | 18 | 8 | 10 | null | null |
k16shikano/hpdft | data/map/cidmapToList.hs | mit | -- | Expand FontForge .cidmap entry
--
-- Examples:
--
-- >>> expandEntry [] "62..63 005d"
-- (Range 62 63,Uni ']')
--
-- >>> expandEntry [] "0 /.notdef"
-- (CID 0,NOTDEF)
--
-- >>> expandEntry [] "1 0020,00a0"
-- (CID 1,Variation "\160 ")
--
-- >>> expandEntry [] "124 /uni2026.dup1"
-- (CID 124,Dup '\8230' 1)
--
-- >>> expandEntry ["646 ff40"] "390 /Japan1.646.hw"
-- (CID 390,Hw '\65344')
expandEntry :: [String] -> String -> (FFE, FFC)
expandEntry ffmap s = let (cids, val) = break (==' ') s
ffe = if ".." `isInfixOf` cids
then mkrange
(takeWhile isDigit cids) $
(dropWhile (=='.') . dropWhile isDigit) cids
else CID (read cids :: Int)
ffc = readFFValue ffmap $ dropWhile (==' ') val
in (ffe, ffc)
where mkrange s s' = Range (read s :: Int) (read s' :: Int) | 980 | expandEntry :: [String] -> String -> (FFE, FFC)
expandEntry ffmap s = let (cids, val) = break (==' ') s
ffe = if ".." `isInfixOf` cids
then mkrange
(takeWhile isDigit cids) $
(dropWhile (=='.') . dropWhile isDigit) cids
else CID (read cids :: Int)
ffc = readFFValue ffmap $ dropWhile (==' ') val
in (ffe, ffc)
where mkrange s s' = Range (read s :: Int) (read s' :: Int) | 586 | expandEntry ffmap s = let (cids, val) = break (==' ') s
ffe = if ".." `isInfixOf` cids
then mkrange
(takeWhile isDigit cids) $
(dropWhile (=='.') . dropWhile isDigit) cids
else CID (read cids :: Int)
ffc = readFFValue ffmap $ dropWhile (==' ') val
in (ffe, ffc)
where mkrange s s' = Range (read s :: Int) (read s' :: Int) | 538 | true | true | 0 | 15 | 354 | 206 | 118 | 88 | null | null |
scott-fleischman/greek-grammar | haskell/greek-grammar/src/Data/Unicode/DecomposeChar.hs | mit | decomposeChar '\xFA81' = "\x5B28" | 33 | decomposeChar '\xFA81' = "\x5B28" | 33 | decomposeChar '\xFA81' = "\x5B28" | 33 | false | false | 0 | 4 | 3 | 10 | 4 | 6 | null | null |
olsner/ghc | testsuite/tests/typecheck/should_compile/Vta1.hs | bsd-3-clause | -- "7" :: String
intcons a = (:) @Int a | 40 | intcons a = (:) @Int a | 22 | intcons a = (:) @Int a | 22 | true | false | 1 | 5 | 10 | 24 | 10 | 14 | null | null |
miie/bkr | src/System/Bkr/BkrConfig.hs | bsd-3-clause | {-| Like getConfPairsFromFile but takes a file handle instead of FilePath. -}
getConfPairsFromFile_ :: Handle -> IO [(T.Text, T.Text)]
getConfPairsFromFile_ hndl = do
--logDebug "getConfPairsFromFile_ called"
-- Read the config file, split into lines and pack as Text
readF <- hGetContents hndl
return $ map getConfPair (getFilteredLines readF)
{-| Like getConfPairsFromFile' but takes a file handle instead of FilePath. -} | 445 | getConfPairsFromFile_ :: Handle -> IO [(T.Text, T.Text)]
getConfPairsFromFile_ hndl = do
--logDebug "getConfPairsFromFile_ called"
-- Read the config file, split into lines and pack as Text
readF <- hGetContents hndl
return $ map getConfPair (getFilteredLines readF)
{-| Like getConfPairsFromFile' but takes a file handle instead of FilePath. -} | 367 | getConfPairsFromFile_ hndl = do
--logDebug "getConfPairsFromFile_ called"
-- Read the config file, split into lines and pack as Text
readF <- hGetContents hndl
return $ map getConfPair (getFilteredLines readF)
{-| Like getConfPairsFromFile' but takes a file handle instead of FilePath. -} | 310 | true | true | 0 | 11 | 81 | 71 | 35 | 36 | null | null |
forste/haReFork | refactorer/PwPf/PwPfConversion.hs | bsd-3-clause | getVars (t1:@:t2) = (getVars t1) ++ (getVars t2) | 53 | getVars (t1:@:t2) = (getVars t1) ++ (getVars t2) | 53 | getVars (t1:@:t2) = (getVars t1) ++ (getVars t2) | 53 | false | false | 0 | 7 | 12 | 32 | 16 | 16 | null | null |
davnils/katt | katt-lib/src/Utils/Katt/Init.hs | bsd-3-clause | initializeSession :: Bool -> ProblemSession -> ConfigEnv IO ()
initializeSession retrieveTests session = do
contents <- retrievePublicPage $ sessionPage <> B.pack (show session)
problems <- nub <$> (EitherT . return . fmapL (B.pack . show) $ parse' contents)
mapM_ (\problem -> do
initializeProblem True retrieveTests problem
restoreDir
)
problems
where
parse' = parse parseProblemList "Problem list parser"
restoreDir = S.liftIO $ D.setCurrentDirectory ".."
-- | Given a problem identifier, setup directory structures and
-- optionally download test cases. | 593 | initializeSession :: Bool -> ProblemSession -> ConfigEnv IO ()
initializeSession retrieveTests session = do
contents <- retrievePublicPage $ sessionPage <> B.pack (show session)
problems <- nub <$> (EitherT . return . fmapL (B.pack . show) $ parse' contents)
mapM_ (\problem -> do
initializeProblem True retrieveTests problem
restoreDir
)
problems
where
parse' = parse parseProblemList "Problem list parser"
restoreDir = S.liftIO $ D.setCurrentDirectory ".."
-- | Given a problem identifier, setup directory structures and
-- optionally download test cases. | 593 | initializeSession retrieveTests session = do
contents <- retrievePublicPage $ sessionPage <> B.pack (show session)
problems <- nub <$> (EitherT . return . fmapL (B.pack . show) $ parse' contents)
mapM_ (\problem -> do
initializeProblem True retrieveTests problem
restoreDir
)
problems
where
parse' = parse parseProblemList "Problem list parser"
restoreDir = S.liftIO $ D.setCurrentDirectory ".."
-- | Given a problem identifier, setup directory structures and
-- optionally download test cases. | 530 | false | true | 0 | 15 | 113 | 158 | 76 | 82 | null | null |
jml/language-python | src/Language/Python/Common/PrettyAST.hs | bsd-3-clause | prettyGuards ((cond,body):guards)
= text "elif" <+> pretty cond <> colon $+$ indent (prettySuite body) $+$
prettyGuards guards | 134 | prettyGuards ((cond,body):guards)
= text "elif" <+> pretty cond <> colon $+$ indent (prettySuite body) $+$
prettyGuards guards | 134 | prettyGuards ((cond,body):guards)
= text "elif" <+> pretty cond <> colon $+$ indent (prettySuite body) $+$
prettyGuards guards | 134 | false | false | 0 | 9 | 24 | 56 | 27 | 29 | null | null |
brendanhay/gogol | gogol-storage/gen/Network/Google/Storage/Types/Product.hs | mpl-2.0 | -- | The name of the bucket containing this object.
objBucket :: Lens' Object (Maybe Text)
objBucket
= lens _objBucket (\ s a -> s{_objBucket = a}) | 149 | objBucket :: Lens' Object (Maybe Text)
objBucket
= lens _objBucket (\ s a -> s{_objBucket = a}) | 97 | objBucket
= lens _objBucket (\ s a -> s{_objBucket = a}) | 58 | true | true | 0 | 9 | 28 | 48 | 25 | 23 | null | null |
dmbarbour/awelon | hsrc/ABC/Imperative/Value.hs | bsd-3-clause | simplEQ _ _ = False | 19 | simplEQ _ _ = False | 19 | simplEQ _ _ = False | 19 | false | false | 1 | 5 | 4 | 12 | 5 | 7 | null | null |
remyoudompheng/hs-language-go | Language/Go/Parser/Tokens.hs | gpl-3.0 | insertSemi :: [GoTokenPos] -> [GoTokenPos]
insertSemi = stripAuto . stripNone .
insertAfter . stripNone . appendSemi | 130 | insertSemi :: [GoTokenPos] -> [GoTokenPos]
insertSemi = stripAuto . stripNone .
insertAfter . stripNone . appendSemi | 130 | insertSemi = stripAuto . stripNone .
insertAfter . stripNone . appendSemi | 87 | false | true | 4 | 8 | 29 | 48 | 21 | 27 | null | null |
nakamuray/htig | HTIG/IRCServer/Constants.hs | bsd-3-clause | rPL_INFO = 371 | 14 | rPL_INFO = 371 | 14 | rPL_INFO = 371 | 14 | false | false | 1 | 5 | 2 | 10 | 3 | 7 | null | null |
hobofan/dotfiles | xmonad/xmonad.hs | mit | -- The default number of workspaces (virtual screens) and their names.
-- By default we use numeric strings, but any string may be used as a
-- workspace name. The number of workspaces is determined by the length
-- of this list.
--
-- A tagging example:
--
-- > workspaces = ["web", "irc", "code" ] ++ map show [4..9]
--
myWorkspaces = withScreens 3 ["1","2","3","4","5","6","7","8","9"] | 391 | myWorkspaces = withScreens 3 ["1","2","3","4","5","6","7","8","9"] | 69 | myWorkspaces = withScreens 3 ["1","2","3","4","5","6","7","8","9"] | 69 | true | false | 0 | 6 | 68 | 47 | 32 | 15 | null | null |
geophf/1HaskellADay | exercises/HAD/Y2014/M03/D21/Solution.hs | mit | -- $setup
-- >>> import Test.QuickCheck
-- >>> import Data.Maybe (fromJust)
-- | minmax
-- get apair of the min and max element of a list (in one pass)
-- returns Nothing on empty list
--
-- Point-free: checked
--
-- The function signature follows the idea of the methods in the System.Random
-- module: given a standard generator, you returns the modified list and the
-- generator in an altered state.
--
-- >>> minmax [0..10]
-- Just (0,10)
--
-- >>> minmax []
-- Nothing
--
-- prop> \(NonEmpty(xs)) -> minimum xs == (fst . fromJust . minmax) xs
-- prop> \(NonEmpty(xs)) -> maximum xs == (snd . fromJust . minmax) xs
--
minmax :: Ord a => [a] -> Maybe (a,a)
minmax =
listToMaybe
. scanr1 (flip (liftA2 (&&&) (min . fst) (max . snd)) . fst)
. (zip <*> id) | 764 | minmax :: Ord a => [a] -> Maybe (a,a)
minmax =
listToMaybe
. scanr1 (flip (liftA2 (&&&) (min . fst) (max . snd)) . fst)
. (zip <*> id) | 140 | minmax =
listToMaybe
. scanr1 (flip (liftA2 (&&&) (min . fst) (max . snd)) . fst)
. (zip <*> id) | 102 | true | true | 2 | 12 | 150 | 113 | 69 | 44 | null | null |
forked-upstream-packages-for-ghcjs/ghc | compiler/prelude/PrelNames.hs | bsd-3-clause | integerDataConKey = mkPreludeDataConUnique 18 | 67 | integerDataConKey = mkPreludeDataConUnique 18 | 67 | integerDataConKey = mkPreludeDataConUnique 18 | 67 | false | false | 0 | 5 | 25 | 9 | 4 | 5 | null | null |
green-haskell/ghc | compiler/main/DriverPipeline.hs | bsd-3-clause | runPhase (RealPhase (HsPp sf)) input_fn dflags
= do
if not (gopt Opt_Pp dflags) then
-- no need to preprocess, just pass input file along
-- to the next phase of the pipeline.
return (RealPhase (Hsc sf), input_fn)
else do
PipeEnv{src_basename, src_suffix} <- getPipeEnv
let orig_fn = src_basename <.> src_suffix
output_fn <- phaseOutputFilename (Hsc sf)
liftIO $ SysTools.runPp dflags
( [ SysTools.Option orig_fn
, SysTools.Option input_fn
, SysTools.FileOption "" output_fn
]
)
-- re-read pragmas now that we've parsed the file (see #3674)
src_opts <- liftIO $ getOptionsFromFile dflags output_fn
(dflags1, unhandled_flags, warns)
<- liftIO $ parseDynamicFilePragma dflags src_opts
setDynFlags dflags1
liftIO $ checkProcessArgsResult dflags1 unhandled_flags
liftIO $ handleFlagWarnings dflags1 warns
return (RealPhase (Hsc sf), output_fn)
-----------------------------------------------------------------------------
-- Hsc phase
-- Compilation of a single module, in "legacy" mode (_not_ under
-- the direction of the compilation manager). | 1,391 | runPhase (RealPhase (HsPp sf)) input_fn dflags
= do
if not (gopt Opt_Pp dflags) then
-- no need to preprocess, just pass input file along
-- to the next phase of the pipeline.
return (RealPhase (Hsc sf), input_fn)
else do
PipeEnv{src_basename, src_suffix} <- getPipeEnv
let orig_fn = src_basename <.> src_suffix
output_fn <- phaseOutputFilename (Hsc sf)
liftIO $ SysTools.runPp dflags
( [ SysTools.Option orig_fn
, SysTools.Option input_fn
, SysTools.FileOption "" output_fn
]
)
-- re-read pragmas now that we've parsed the file (see #3674)
src_opts <- liftIO $ getOptionsFromFile dflags output_fn
(dflags1, unhandled_flags, warns)
<- liftIO $ parseDynamicFilePragma dflags src_opts
setDynFlags dflags1
liftIO $ checkProcessArgsResult dflags1 unhandled_flags
liftIO $ handleFlagWarnings dflags1 warns
return (RealPhase (Hsc sf), output_fn)
-----------------------------------------------------------------------------
-- Hsc phase
-- Compilation of a single module, in "legacy" mode (_not_ under
-- the direction of the compilation manager). | 1,391 | runPhase (RealPhase (HsPp sf)) input_fn dflags
= do
if not (gopt Opt_Pp dflags) then
-- no need to preprocess, just pass input file along
-- to the next phase of the pipeline.
return (RealPhase (Hsc sf), input_fn)
else do
PipeEnv{src_basename, src_suffix} <- getPipeEnv
let orig_fn = src_basename <.> src_suffix
output_fn <- phaseOutputFilename (Hsc sf)
liftIO $ SysTools.runPp dflags
( [ SysTools.Option orig_fn
, SysTools.Option input_fn
, SysTools.FileOption "" output_fn
]
)
-- re-read pragmas now that we've parsed the file (see #3674)
src_opts <- liftIO $ getOptionsFromFile dflags output_fn
(dflags1, unhandled_flags, warns)
<- liftIO $ parseDynamicFilePragma dflags src_opts
setDynFlags dflags1
liftIO $ checkProcessArgsResult dflags1 unhandled_flags
liftIO $ handleFlagWarnings dflags1 warns
return (RealPhase (Hsc sf), output_fn)
-----------------------------------------------------------------------------
-- Hsc phase
-- Compilation of a single module, in "legacy" mode (_not_ under
-- the direction of the compilation manager). | 1,391 | false | false | 0 | 15 | 486 | 252 | 123 | 129 | null | null |
vTurbine/w3dhs | src/Game/Title.hs | mit | -- acid blue for PG13 logo background
-- | Display PG13 logo
--
pg13 :: StateT GameState IO ()
pg13 = do
gstate <- get
vwFadeOut
-- clear the screen
vwbBar (Rect 0 0 320 200) pg13BgColor
-- display PG13 logo
vwbDrawPic (Point 216 110) PG13PIC
vwFadeIn
inUserInput 3000
vwFadeOut
-- | Shows title pages in loop
-- | 339 | pg13 :: StateT GameState IO ()
pg13 = do
gstate <- get
vwFadeOut
-- clear the screen
vwbBar (Rect 0 0 320 200) pg13BgColor
-- display PG13 logo
vwbDrawPic (Point 216 110) PG13PIC
vwFadeIn
inUserInput 3000
vwFadeOut
-- | Shows title pages in loop
-- | 273 | pg13 = do
gstate <- get
vwFadeOut
-- clear the screen
vwbBar (Rect 0 0 320 200) pg13BgColor
-- display PG13 logo
vwbDrawPic (Point 216 110) PG13PIC
vwFadeIn
inUserInput 3000
vwFadeOut
-- | Shows title pages in loop
-- | 242 | true | true | 0 | 9 | 84 | 85 | 41 | 44 | null | null |
jamesyang124/haskell-playground | src/Chp2.hs | bsd-3-clause | {--
Lexically, infix operators consist entirely of "symbols," as opposed to normal identifiers which are alphanumeric (§2.4). Haskell has no prefix operators, with the exception of minus (-), which is both infix and prefix.]
https://www.haskell.org/tutorial/functions.html 3.2
when use infix symbol operators as prefix, surrond parenthesis first:
[] ++ [1,2,3]
(++) [] [1,2,3]
z = (++ [])
z [1,2,3]
[1,2,3]
--}
-- | range(lower..upper) increment by 1
range0 = [2..10] | 476 | range0 = [2..10] | 16 | range0 = [2..10] | 16 | true | false | 0 | 5 | 77 | 13 | 8 | 5 | null | null |
benzrf/cas | src/ProofCas/Rendering.hs | gpl-3.0 | rlrec :: a -> RenderLayer a
rlrec = RenderLayer . pure . Rec | 60 | rlrec :: a -> RenderLayer a
rlrec = RenderLayer . pure . Rec | 60 | rlrec = RenderLayer . pure . Rec | 32 | false | true | 0 | 6 | 12 | 26 | 13 | 13 | null | null |
Palmik/data-store | tests/Test/Data/Store01.hs | bsd-3-clause | prop_update3 = test1
where
test1 :: Bool
test1 = lookupRes1 == [v2] &&
lookupRes2 == [v3] &&
lookupRes3 == [v1] &&
lookupRes4 == [v1] &&
lookupRes5 == [v1] &&
S.size res == 3
where
res = fromJust $ S.update (\v -> Just (v, Just $ makeKey 0 0 [0] [0])) (sOO .== minBound) store
lookupRes1 = map snd $ S.lookup (sOM .== 1) res
lookupRes2 = map snd $ S.lookup (sMM .== 1) res
lookupRes3 = map snd $ S.lookup (sOM .== 0) res
lookupRes4 = map snd $ S.lookup (sMO .== 0) res
lookupRes5 = map snd $ S.lookup (sMM .== 0) res
store :: DS
store = foldl (\s v -> snd . fromJust $ S.insert (vkey v) v s) S.empty ds
ds :: [D]
ds = [v1, v2, v3]
v1 = D 1 [1] [1]
v2 = D 1 [2] [2, 3]
v3 = D 2 [3] [1, 2]
--------------------------------------------------------------------------------
-- | QuickCheck machinery. | 995 | prop_update3 = test1
where
test1 :: Bool
test1 = lookupRes1 == [v2] &&
lookupRes2 == [v3] &&
lookupRes3 == [v1] &&
lookupRes4 == [v1] &&
lookupRes5 == [v1] &&
S.size res == 3
where
res = fromJust $ S.update (\v -> Just (v, Just $ makeKey 0 0 [0] [0])) (sOO .== minBound) store
lookupRes1 = map snd $ S.lookup (sOM .== 1) res
lookupRes2 = map snd $ S.lookup (sMM .== 1) res
lookupRes3 = map snd $ S.lookup (sOM .== 0) res
lookupRes4 = map snd $ S.lookup (sMO .== 0) res
lookupRes5 = map snd $ S.lookup (sMM .== 0) res
store :: DS
store = foldl (\s v -> snd . fromJust $ S.insert (vkey v) v s) S.empty ds
ds :: [D]
ds = [v1, v2, v3]
v1 = D 1 [1] [1]
v2 = D 1 [2] [2, 3]
v3 = D 2 [3] [1, 2]
--------------------------------------------------------------------------------
-- | QuickCheck machinery. | 995 | prop_update3 = test1
where
test1 :: Bool
test1 = lookupRes1 == [v2] &&
lookupRes2 == [v3] &&
lookupRes3 == [v1] &&
lookupRes4 == [v1] &&
lookupRes5 == [v1] &&
S.size res == 3
where
res = fromJust $ S.update (\v -> Just (v, Just $ makeKey 0 0 [0] [0])) (sOO .== minBound) store
lookupRes1 = map snd $ S.lookup (sOM .== 1) res
lookupRes2 = map snd $ S.lookup (sMM .== 1) res
lookupRes3 = map snd $ S.lookup (sOM .== 0) res
lookupRes4 = map snd $ S.lookup (sMO .== 0) res
lookupRes5 = map snd $ S.lookup (sMM .== 0) res
store :: DS
store = foldl (\s v -> snd . fromJust $ S.insert (vkey v) v s) S.empty ds
ds :: [D]
ds = [v1, v2, v3]
v1 = D 1 [1] [1]
v2 = D 1 [2] [2, 3]
v3 = D 2 [3] [1, 2]
--------------------------------------------------------------------------------
-- | QuickCheck machinery. | 995 | false | false | 5 | 17 | 356 | 421 | 220 | 201 | null | null |
mumuki/mulang | src/Language/Mulang/Analyzer/ExpectationsAnalyzer.hs | gpl-3.0 | analyseExpectations :: Expression -> Maybe [Expectation] -> [QueryResult]
analyseExpectations content = map (analyseExpectation content) . (fromMaybe []) | 153 | analyseExpectations :: Expression -> Maybe [Expectation] -> [QueryResult]
analyseExpectations content = map (analyseExpectation content) . (fromMaybe []) | 153 | analyseExpectations content = map (analyseExpectation content) . (fromMaybe []) | 79 | false | true | 0 | 8 | 16 | 52 | 26 | 26 | null | null |
haroldcarr/learn-haskell-coq-ml-etc | haskell/topic/lens/2019-12-chris-penner-advent-of-optics/test/TestDay01.hs | unlicense | test_CalculateRequiredFuel :: TestTree
test_CalculateRequiredFuel =
testGroup "test_day01_CalculateRequiredFuel"
[ testCase " 12" $ calculateRequiredFuel 12.0 @?= 2.0
, testCase " 14" $ calculateRequiredFuel 14.0 @?= 2.0
, testCase " 1969" $ calculateRequiredFuel 1969.0 @?= 654.0
, testCase "100756" $ calculateRequiredFuel 100756.0 @?= 33583.0
] | 387 | test_CalculateRequiredFuel :: TestTree
test_CalculateRequiredFuel =
testGroup "test_day01_CalculateRequiredFuel"
[ testCase " 12" $ calculateRequiredFuel 12.0 @?= 2.0
, testCase " 14" $ calculateRequiredFuel 14.0 @?= 2.0
, testCase " 1969" $ calculateRequiredFuel 1969.0 @?= 654.0
, testCase "100756" $ calculateRequiredFuel 100756.0 @?= 33583.0
] | 387 | test_CalculateRequiredFuel =
testGroup "test_day01_CalculateRequiredFuel"
[ testCase " 12" $ calculateRequiredFuel 12.0 @?= 2.0
, testCase " 14" $ calculateRequiredFuel 14.0 @?= 2.0
, testCase " 1969" $ calculateRequiredFuel 1969.0 @?= 654.0
, testCase "100756" $ calculateRequiredFuel 100756.0 @?= 33583.0
] | 348 | false | true | 0 | 9 | 82 | 92 | 41 | 51 | null | null |
PipocaQuemada/ermine | tests/unit-tests/LoaderTests.hs | bsd-2-clause | stdLibLoader :: Loader Freshness (ExceptT LoadRefusal IO) String Text
stdLibLoader = contramapName pack $ filesystemLoader stdLibDir "e" | 136 | stdLibLoader :: Loader Freshness (ExceptT LoadRefusal IO) String Text
stdLibLoader = contramapName pack $ filesystemLoader stdLibDir "e" | 136 | stdLibLoader = contramapName pack $ filesystemLoader stdLibDir "e" | 66 | false | true | 1 | 7 | 16 | 44 | 19 | 25 | null | null |
Zoetermeer/latro | src/Latro/Typecheck.hs | mit | fullyAppliedMonoTyCon (TyApp tyCon []) = Just tyCon | 51 | fullyAppliedMonoTyCon (TyApp tyCon []) = Just tyCon | 51 | fullyAppliedMonoTyCon (TyApp tyCon []) = Just tyCon | 51 | false | false | 0 | 8 | 6 | 22 | 10 | 12 | null | null |
ben-schulz/Idris-dev | src/Idris/AbsSyntaxTree.hs | bsd-3-clause | mapPTermFC f g (PResolveTC fc) = PResolveTC (f fc) | 65 | mapPTermFC f g (PResolveTC fc) = PResolveTC (f fc) | 65 | mapPTermFC f g (PResolveTC fc) = PResolveTC (f fc) | 65 | false | false | 0 | 7 | 23 | 31 | 13 | 18 | null | null |
ocramz/petsc-hs | src/Numerical/PETSc/Internal/InlineC.hs | gpl-3.0 | -- PETSC_EXTERN PetscErrorCode VecAXPY(Vec,PetscScalar,Vec);
-- VecAXPY - Computes y = alpha x + y.
-- Notes: x and y MUST be different vectors
-- PetscErrorCode VecAXPY(Vec y,PetscScalar alpha,Vec x)
vecAxpy' :: Vec -> PetscScalar_ -> Vec -> IO CInt
vecAxpy' y a x = [C.exp|int{VecAXPY($(Vec y),$(PetscScalar a),$(Vec x))}|] | 332 | vecAxpy' :: Vec -> PetscScalar_ -> Vec -> IO CInt
vecAxpy' y a x = [C.exp|int{VecAXPY($(Vec y),$(PetscScalar a),$(Vec x))}|] | 124 | vecAxpy' y a x = [C.exp|int{VecAXPY($(Vec y),$(PetscScalar a),$(Vec x))}|] | 74 | true | true | 0 | 8 | 54 | 49 | 26 | 23 | null | null |
crackleware/hscolour | Language/Haskell/HsColour/CSS.hs | gpl-2.0 | cssClass Error = "hs-sel" | 28 | cssClass Error = "hs-sel" | 28 | cssClass Error = "hs-sel" | 28 | false | false | 0 | 5 | 6 | 9 | 4 | 5 | null | null |
romanb/amazonka | amazonka-iam/gen/Network/AWS/IAM/Types.hs | mpl-2.0 | -- | The friendly name that identifies the role.
rdRoleName :: Lens' RoleDetail (Maybe Text)
rdRoleName = lens _rdRoleName (\s a -> s { _rdRoleName = a }) | 154 | rdRoleName :: Lens' RoleDetail (Maybe Text)
rdRoleName = lens _rdRoleName (\s a -> s { _rdRoleName = a }) | 105 | rdRoleName = lens _rdRoleName (\s a -> s { _rdRoleName = a }) | 61 | true | true | 2 | 9 | 27 | 55 | 25 | 30 | null | null |
markus-git/co-feldspar | src/Feldspar/Hardware/Frontend.hs | bsd-3-clause | -- 'Imp.setRef' specialized to hardware.
setRef' :: forall b . HardwarePrimType b => Imp.Variable b -> HExp b -> Oper.Program HardwareCMD (Oper.Param2 HExp HardwarePrimType) ()
setRef' = withHType (Proxy :: Proxy b) Imp.setVariable | 231 | setRef' :: forall b . HardwarePrimType b => Imp.Variable b -> HExp b -> Oper.Program HardwareCMD (Oper.Param2 HExp HardwarePrimType) ()
setRef' = withHType (Proxy :: Proxy b) Imp.setVariable | 190 | setRef' = withHType (Proxy :: Proxy b) Imp.setVariable | 54 | true | true | 0 | 12 | 32 | 77 | 38 | 39 | null | null |
awgn/ass | src/Ass/Cpp/Token.hs | gpl-2.0 | isOperOrPunct _ = False | 23 | isOperOrPunct _ = False | 23 | isOperOrPunct _ = False | 23 | false | false | 0 | 5 | 3 | 9 | 4 | 5 | null | null |
mikebenfield/hclaws | src/Math/Hclaws/Integration.hs | isc | rungeKutta
:: (VectorSpace a, Scalar a ~ Double)
=> Int
-> (a -> Double -> a)
-> a
-> Double
-> a
rungeKutta steps eqn x0 t
| steps <= 0 = x0
| otherwise = loop steps x0 0
where
stepSize = t / fromIntegral steps
stepSizeHalf = 0.5 * stepSize
stepSizeSixth = (1/6) * stepSize
loop stepsRemaining xC tC
| stepsRemaining == 0 = xC
| otherwise =
loop (stepsRemaining - 1)
(xC +. stepSizeSixth*:(k1 +. 2*:(k2+.k3) +. k4))
(tC + stepSize)
where
middleT = t + stepSizeHalf
k1 = eqn xC t
k2 = eqn (xC +. stepSizeHalf*:k1) middleT
k3 = eqn (xC +. stepSizeHalf*:k2) middleT
k4 = eqn (xC +. stepSize*:k3) (t + stepSize) | 744 | rungeKutta
:: (VectorSpace a, Scalar a ~ Double)
=> Int
-> (a -> Double -> a)
-> a
-> Double
-> a
rungeKutta steps eqn x0 t
| steps <= 0 = x0
| otherwise = loop steps x0 0
where
stepSize = t / fromIntegral steps
stepSizeHalf = 0.5 * stepSize
stepSizeSixth = (1/6) * stepSize
loop stepsRemaining xC tC
| stepsRemaining == 0 = xC
| otherwise =
loop (stepsRemaining - 1)
(xC +. stepSizeSixth*:(k1 +. 2*:(k2+.k3) +. k4))
(tC + stepSize)
where
middleT = t + stepSizeHalf
k1 = eqn xC t
k2 = eqn (xC +. stepSizeHalf*:k1) middleT
k3 = eqn (xC +. stepSizeHalf*:k2) middleT
k4 = eqn (xC +. stepSize*:k3) (t + stepSize) | 744 | rungeKutta steps eqn x0 t
| steps <= 0 = x0
| otherwise = loop steps x0 0
where
stepSize = t / fromIntegral steps
stepSizeHalf = 0.5 * stepSize
stepSizeSixth = (1/6) * stepSize
loop stepsRemaining xC tC
| stepsRemaining == 0 = xC
| otherwise =
loop (stepsRemaining - 1)
(xC +. stepSizeSixth*:(k1 +. 2*:(k2+.k3) +. k4))
(tC + stepSize)
where
middleT = t + stepSizeHalf
k1 = eqn xC t
k2 = eqn (xC +. stepSizeHalf*:k1) middleT
k3 = eqn (xC +. stepSizeHalf*:k2) middleT
k4 = eqn (xC +. stepSize*:k3) (t + stepSize) | 622 | false | true | 6 | 13 | 253 | 311 | 157 | 154 | null | null |
alexstachnik/High-Level-C | src/Language/HLC/HighLevelC/CWriter.hs | gpl-2.0 | grabStructVars :: (MonadWriter CWriter m) => m a -> m [StructField]
grabStructVars m = censor (hideBlock . hideStructVarDecls) $ do
(_,c) <- listen m
return $ toList $ structVarDecls c | 188 | grabStructVars :: (MonadWriter CWriter m) => m a -> m [StructField]
grabStructVars m = censor (hideBlock . hideStructVarDecls) $ do
(_,c) <- listen m
return $ toList $ structVarDecls c | 188 | grabStructVars m = censor (hideBlock . hideStructVarDecls) $ do
(_,c) <- listen m
return $ toList $ structVarDecls c | 120 | false | true | 0 | 9 | 33 | 82 | 40 | 42 | null | null |
Zankoku-Okuno/octopus | Language/Octopus/Primitive.hs | gpl-3.0 | cut xs n = Left $ mkTypeError (Pr Cut) "(Sq * | Tx | By, Nat)" (mkSq [xs, n]) | 77 | cut xs n = Left $ mkTypeError (Pr Cut) "(Sq * | Tx | By, Nat)" (mkSq [xs, n]) | 77 | cut xs n = Left $ mkTypeError (Pr Cut) "(Sq * | Tx | By, Nat)" (mkSq [xs, n]) | 77 | false | false | 3 | 8 | 18 | 45 | 20 | 25 | null | null |
massysett/penny | penny/lib/Penny/Copper/Copperize.hs | bsd-3-clause | cTDIV :: TDIV Char ()
cTDIV = TDIV $ cSeries "TDIV" | 51 | cTDIV :: TDIV Char ()
cTDIV = TDIV $ cSeries "TDIV" | 51 | cTDIV = TDIV $ cSeries "TDIV" | 29 | false | true | 0 | 6 | 10 | 25 | 12 | 13 | null | null |
DronovIlya/filemanager-hs | src/Files/Utils.hs | gpl-2.0 | -- |Apply a function on the content variable. If there is no content variable
-- for the given constructor the value from the `Default` class is used.
fromFreeVar :: (Default d) => (a -> d) -> File a -> d
fromFreeVar f df = maybeD f $ getFreeVar df | 248 | fromFreeVar :: (Default d) => (a -> d) -> File a -> d
fromFreeVar f df = maybeD f $ getFreeVar df | 97 | fromFreeVar f df = maybeD f $ getFreeVar df | 43 | true | true | 0 | 8 | 48 | 55 | 28 | 27 | null | null |
kmels/hledger | hledger/Hledger/Cli/Options.hs | gpl-3.0 | outputFormats =
[defaultOutputFormat] ++
["csv"
] | 55 | outputFormats =
[defaultOutputFormat] ++
["csv"
] | 55 | outputFormats =
[defaultOutputFormat] ++
["csv"
] | 55 | false | false | 0 | 6 | 11 | 16 | 9 | 7 | null | null |
iu-parfunc/containers | Data/Sequence.hs | bsd-3-clause | -- | @'replicateSeq' n xs@ concatenates @n@ copies of @xs@.
replicateSeq :: Int -> Seq a -> Seq a
replicateSeq n s
| n < 0 = error "replicateSeq takes a nonnegative integer argument"
| n == 0 = empty
| otherwise = go n s
where
-- Invariant: k >= 1
go 1 xs = xs
go k xs | even k = kxs
| otherwise = xs >< kxs
where kxs = go (k `quot` 2) $! (xs >< xs)
-- | /O(1)/. Add an element to the left end of a sequence.
-- Mnemonic: a triangle with the single element at the pointy end. | 530 | replicateSeq :: Int -> Seq a -> Seq a
replicateSeq n s
| n < 0 = error "replicateSeq takes a nonnegative integer argument"
| n == 0 = empty
| otherwise = go n s
where
-- Invariant: k >= 1
go 1 xs = xs
go k xs | even k = kxs
| otherwise = xs >< kxs
where kxs = go (k `quot` 2) $! (xs >< xs)
-- | /O(1)/. Add an element to the left end of a sequence.
-- Mnemonic: a triangle with the single element at the pointy end. | 470 | replicateSeq n s
| n < 0 = error "replicateSeq takes a nonnegative integer argument"
| n == 0 = empty
| otherwise = go n s
where
-- Invariant: k >= 1
go 1 xs = xs
go k xs | even k = kxs
| otherwise = xs >< kxs
where kxs = go (k `quot` 2) $! (xs >< xs)
-- | /O(1)/. Add an element to the left end of a sequence.
-- Mnemonic: a triangle with the single element at the pointy end. | 432 | true | true | 2 | 10 | 161 | 148 | 72 | 76 | null | null |
coolhacks/scripts-hacks | examples/shellcheck-master/ShellCheck/Parser.hs | mit | tryParseWordToken keyword t = try $ do
id <- getNextId
str <- anycaseString keyword
optional $ do
try . lookAhead $ char '['
parseProblem ErrorC 1069 "You need a space before the [."
optional $ do
try . lookAhead $ char '#'
parseProblem ErrorC 1099 "You need a space before the #."
try $ lookAhead keywordSeparator
when (str /= keyword) $
parseProblem ErrorC 1081 $
"Scripts are case sensitive. Use '" ++ keyword ++ "', not '" ++ str ++ "'."
return $ t id | 537 | tryParseWordToken keyword t = try $ do
id <- getNextId
str <- anycaseString keyword
optional $ do
try . lookAhead $ char '['
parseProblem ErrorC 1069 "You need a space before the [."
optional $ do
try . lookAhead $ char '#'
parseProblem ErrorC 1099 "You need a space before the #."
try $ lookAhead keywordSeparator
when (str /= keyword) $
parseProblem ErrorC 1081 $
"Scripts are case sensitive. Use '" ++ keyword ++ "', not '" ++ str ++ "'."
return $ t id | 537 | tryParseWordToken keyword t = try $ do
id <- getNextId
str <- anycaseString keyword
optional $ do
try . lookAhead $ char '['
parseProblem ErrorC 1069 "You need a space before the [."
optional $ do
try . lookAhead $ char '#'
parseProblem ErrorC 1099 "You need a space before the #."
try $ lookAhead keywordSeparator
when (str /= keyword) $
parseProblem ErrorC 1081 $
"Scripts are case sensitive. Use '" ++ keyword ++ "', not '" ++ str ++ "'."
return $ t id | 537 | false | false | 0 | 16 | 166 | 156 | 68 | 88 | null | null |
abakst/liquidhaskell | src/Language/Haskell/Liquid/UX/Tidy.hs | bsd-3-clause | tidyVV r@(Reft (va,_))
| isJunk va = shiftVV r v'
| otherwise = r
where
v' = if v `elem` xs then symbol ("v'" :: T.Text) else v
v = symbol ("v" :: T.Text)
xs = syms r
isJunk = isPrefixOfSym "x" | 240 | tidyVV r@(Reft (va,_))
| isJunk va = shiftVV r v'
| otherwise = r
where
v' = if v `elem` xs then symbol ("v'" :: T.Text) else v
v = symbol ("v" :: T.Text)
xs = syms r
isJunk = isPrefixOfSym "x" | 240 | tidyVV r@(Reft (va,_))
| isJunk va = shiftVV r v'
| otherwise = r
where
v' = if v `elem` xs then symbol ("v'" :: T.Text) else v
v = symbol ("v" :: T.Text)
xs = syms r
isJunk = isPrefixOfSym "x" | 240 | false | false | 4 | 9 | 88 | 111 | 58 | 53 | null | null |
MichielDerhaeg/stack | src/Stack/Prelude.hs | bsd-3-clause | -- | Monadic 'mapMaybe'.
mapMaybeM :: Monad m => (a -> m (Maybe b)) -> [a] -> m [b]
mapMaybeM f = liftM catMaybes . mapM f | 122 | mapMaybeM :: Monad m => (a -> m (Maybe b)) -> [a] -> m [b]
mapMaybeM f = liftM catMaybes . mapM f | 97 | mapMaybeM f = liftM catMaybes . mapM f | 38 | true | true | 0 | 11 | 26 | 65 | 32 | 33 | null | null |
ckaestne/CIDE | CIDE_Language_Haskell/test/FGL-layout/Graph/Inductive/Internal/Heap.hs | gpl-3.0 | merge Empty h = h | 17 | merge Empty h = h | 17 | merge Empty h = h | 17 | false | false | 1 | 5 | 4 | 16 | 5 | 11 | null | null |
brendanhay/gogol | gogol-dfareporting/gen/Network/Google/DFAReporting/Types/Product.hs | mpl-2.0 | -- | Terms and conditions of this order.
oTermsAndConditions :: Lens' Order (Maybe Text)
oTermsAndConditions
= lens _oTermsAndConditions
(\ s a -> s{_oTermsAndConditions = a}) | 183 | oTermsAndConditions :: Lens' Order (Maybe Text)
oTermsAndConditions
= lens _oTermsAndConditions
(\ s a -> s{_oTermsAndConditions = a}) | 142 | oTermsAndConditions
= lens _oTermsAndConditions
(\ s a -> s{_oTermsAndConditions = a}) | 94 | true | true | 0 | 9 | 32 | 46 | 25 | 21 | null | null |
deech/stack | src/Stack/Options/DockerParser.hs | bsd-3-clause | -- | Options parser configuration for Docker.
dockerOptsParser :: Bool -> Parser DockerOptsMonoid
dockerOptsParser hide0 =
DockerOptsMonoid
<$> pure (Any False)
<*> firstBoolFlags dockerCmdName
"using a Docker container. Implies 'system-ghc: true'"
hide
<*> fmap First
((Just . DockerMonoidRepo) <$> option str (long (dockerOptName dockerRepoArgName) <>
hide <>
metavar "NAME" <>
help "Docker repository name") <|>
(Just . DockerMonoidImage) <$> option str (long (dockerOptName dockerImageArgName) <>
hide <>
metavar "IMAGE" <>
help "Exact Docker image ID (overrides docker-repo)") <|>
pure Nothing)
<*> firstBoolFlags (dockerOptName dockerRegistryLoginArgName)
"registry requires login"
hide
<*> firstStrOption (long (dockerOptName dockerRegistryUsernameArgName) <>
hide <>
metavar "USERNAME" <>
help "Docker registry username")
<*> firstStrOption (long (dockerOptName dockerRegistryPasswordArgName) <>
hide <>
metavar "PASSWORD" <>
help "Docker registry password")
<*> firstBoolFlags (dockerOptName dockerAutoPullArgName)
"automatic pulling latest version of image"
hide
<*> firstBoolFlags (dockerOptName dockerDetachArgName)
"running a detached Docker container"
hide
<*> firstBoolFlags (dockerOptName dockerPersistArgName)
"not deleting container after it exits"
hide
<*> firstStrOption (long (dockerOptName dockerContainerNameArgName) <>
hide <>
metavar "NAME" <>
help "Docker container name")
<*> argsOption (long (dockerOptName dockerRunArgsArgName) <>
hide <>
value [] <>
metavar "'ARG1 [ARG2 ...]'" <>
help "Additional options to pass to 'docker run'")
<*> many (option auto (long (dockerOptName dockerMountArgName) <>
hide <>
metavar "(PATH | HOST-PATH:CONTAINER-PATH)" <>
help ("Mount volumes from host in container " ++
"(may specify multiple times)")))
<*> many (option str (long (dockerOptName dockerEnvArgName) <>
hide <>
metavar "NAME=VALUE" <>
help ("Set environment variable in container " ++
"(may specify multiple times)")))
<*> optionalFirst (absFileOption
(long (dockerOptName dockerDatabasePathArgName) <>
hide <>
metavar "PATH" <>
help "Location of image usage tracking database"))
<*> optionalFirst (option (eitherReader' parseDockerStackExe)
(long(dockerOptName dockerStackExeArgName) <>
hide <>
metavar (intercalate "|"
[ dockerStackExeDownloadVal
, dockerStackExeHostVal
, dockerStackExeImageVal
, "PATH" ]) <>
help (concat [ "Location of "
, stackProgName
, " executable used in container" ])))
<*> firstBoolFlags (dockerOptName dockerSetUserArgName)
"setting user in container to match host"
hide
<*> pure (IntersectingVersionRange anyVersion)
where
dockerOptName optName = dockerCmdName ++ "-" ++ T.unpack optName
firstStrOption = optionalFirst . option str
hide = hideMods hide0
-- | Parser for docker cleanup arguments. | 4,271 | dockerOptsParser :: Bool -> Parser DockerOptsMonoid
dockerOptsParser hide0 =
DockerOptsMonoid
<$> pure (Any False)
<*> firstBoolFlags dockerCmdName
"using a Docker container. Implies 'system-ghc: true'"
hide
<*> fmap First
((Just . DockerMonoidRepo) <$> option str (long (dockerOptName dockerRepoArgName) <>
hide <>
metavar "NAME" <>
help "Docker repository name") <|>
(Just . DockerMonoidImage) <$> option str (long (dockerOptName dockerImageArgName) <>
hide <>
metavar "IMAGE" <>
help "Exact Docker image ID (overrides docker-repo)") <|>
pure Nothing)
<*> firstBoolFlags (dockerOptName dockerRegistryLoginArgName)
"registry requires login"
hide
<*> firstStrOption (long (dockerOptName dockerRegistryUsernameArgName) <>
hide <>
metavar "USERNAME" <>
help "Docker registry username")
<*> firstStrOption (long (dockerOptName dockerRegistryPasswordArgName) <>
hide <>
metavar "PASSWORD" <>
help "Docker registry password")
<*> firstBoolFlags (dockerOptName dockerAutoPullArgName)
"automatic pulling latest version of image"
hide
<*> firstBoolFlags (dockerOptName dockerDetachArgName)
"running a detached Docker container"
hide
<*> firstBoolFlags (dockerOptName dockerPersistArgName)
"not deleting container after it exits"
hide
<*> firstStrOption (long (dockerOptName dockerContainerNameArgName) <>
hide <>
metavar "NAME" <>
help "Docker container name")
<*> argsOption (long (dockerOptName dockerRunArgsArgName) <>
hide <>
value [] <>
metavar "'ARG1 [ARG2 ...]'" <>
help "Additional options to pass to 'docker run'")
<*> many (option auto (long (dockerOptName dockerMountArgName) <>
hide <>
metavar "(PATH | HOST-PATH:CONTAINER-PATH)" <>
help ("Mount volumes from host in container " ++
"(may specify multiple times)")))
<*> many (option str (long (dockerOptName dockerEnvArgName) <>
hide <>
metavar "NAME=VALUE" <>
help ("Set environment variable in container " ++
"(may specify multiple times)")))
<*> optionalFirst (absFileOption
(long (dockerOptName dockerDatabasePathArgName) <>
hide <>
metavar "PATH" <>
help "Location of image usage tracking database"))
<*> optionalFirst (option (eitherReader' parseDockerStackExe)
(long(dockerOptName dockerStackExeArgName) <>
hide <>
metavar (intercalate "|"
[ dockerStackExeDownloadVal
, dockerStackExeHostVal
, dockerStackExeImageVal
, "PATH" ]) <>
help (concat [ "Location of "
, stackProgName
, " executable used in container" ])))
<*> firstBoolFlags (dockerOptName dockerSetUserArgName)
"setting user in container to match host"
hide
<*> pure (IntersectingVersionRange anyVersion)
where
dockerOptName optName = dockerCmdName ++ "-" ++ T.unpack optName
firstStrOption = optionalFirst . option str
hide = hideMods hide0
-- | Parser for docker cleanup arguments. | 4,225 | dockerOptsParser hide0 =
DockerOptsMonoid
<$> pure (Any False)
<*> firstBoolFlags dockerCmdName
"using a Docker container. Implies 'system-ghc: true'"
hide
<*> fmap First
((Just . DockerMonoidRepo) <$> option str (long (dockerOptName dockerRepoArgName) <>
hide <>
metavar "NAME" <>
help "Docker repository name") <|>
(Just . DockerMonoidImage) <$> option str (long (dockerOptName dockerImageArgName) <>
hide <>
metavar "IMAGE" <>
help "Exact Docker image ID (overrides docker-repo)") <|>
pure Nothing)
<*> firstBoolFlags (dockerOptName dockerRegistryLoginArgName)
"registry requires login"
hide
<*> firstStrOption (long (dockerOptName dockerRegistryUsernameArgName) <>
hide <>
metavar "USERNAME" <>
help "Docker registry username")
<*> firstStrOption (long (dockerOptName dockerRegistryPasswordArgName) <>
hide <>
metavar "PASSWORD" <>
help "Docker registry password")
<*> firstBoolFlags (dockerOptName dockerAutoPullArgName)
"automatic pulling latest version of image"
hide
<*> firstBoolFlags (dockerOptName dockerDetachArgName)
"running a detached Docker container"
hide
<*> firstBoolFlags (dockerOptName dockerPersistArgName)
"not deleting container after it exits"
hide
<*> firstStrOption (long (dockerOptName dockerContainerNameArgName) <>
hide <>
metavar "NAME" <>
help "Docker container name")
<*> argsOption (long (dockerOptName dockerRunArgsArgName) <>
hide <>
value [] <>
metavar "'ARG1 [ARG2 ...]'" <>
help "Additional options to pass to 'docker run'")
<*> many (option auto (long (dockerOptName dockerMountArgName) <>
hide <>
metavar "(PATH | HOST-PATH:CONTAINER-PATH)" <>
help ("Mount volumes from host in container " ++
"(may specify multiple times)")))
<*> many (option str (long (dockerOptName dockerEnvArgName) <>
hide <>
metavar "NAME=VALUE" <>
help ("Set environment variable in container " ++
"(may specify multiple times)")))
<*> optionalFirst (absFileOption
(long (dockerOptName dockerDatabasePathArgName) <>
hide <>
metavar "PATH" <>
help "Location of image usage tracking database"))
<*> optionalFirst (option (eitherReader' parseDockerStackExe)
(long(dockerOptName dockerStackExeArgName) <>
hide <>
metavar (intercalate "|"
[ dockerStackExeDownloadVal
, dockerStackExeHostVal
, dockerStackExeImageVal
, "PATH" ]) <>
help (concat [ "Location of "
, stackProgName
, " executable used in container" ])))
<*> firstBoolFlags (dockerOptName dockerSetUserArgName)
"setting user in container to match host"
hide
<*> pure (IntersectingVersionRange anyVersion)
where
dockerOptName optName = dockerCmdName ++ "-" ++ T.unpack optName
firstStrOption = optionalFirst . option str
hide = hideMods hide0
-- | Parser for docker cleanup arguments. | 4,173 | true | true | 50 | 18 | 1,860 | 743 | 364 | 379 | null | null |
ekmett/wxHaskell | wxcore/src/haskell/Graphics/UI/WXCore/WxcDefs.hs | lgpl-2.1 | wxSTC_MATLAB_NUMBER :: Int
wxSTC_MATLAB_NUMBER = 3 | 50 | wxSTC_MATLAB_NUMBER :: Int
wxSTC_MATLAB_NUMBER = 3 | 50 | wxSTC_MATLAB_NUMBER = 3 | 23 | false | true | 0 | 6 | 5 | 18 | 7 | 11 | null | null |
dpaetzel/Zahlengerade | src/Zahlengerade.hs | gpl-3.0 | showGerman :: Double -> String
showGerman double =
if floor double == ceiling double
then show (floor double)
else subRegex (mkRegex "\\.") (show double) "," | 163 | showGerman :: Double -> String
showGerman double =
if floor double == ceiling double
then show (floor double)
else subRegex (mkRegex "\\.") (show double) "," | 163 | showGerman double =
if floor double == ceiling double
then show (floor double)
else subRegex (mkRegex "\\.") (show double) "," | 132 | false | true | 0 | 8 | 30 | 64 | 31 | 33 | null | null |
plcplc/hie | src/Graphics/HIE/Session.hs | agpl-3.0 | sessionCurrentBindings :: Session -> STM (M.Map Identifier (Dynamic, UI))
sessionCurrentBindings (Session{..}) = readTVar sessionMap | 132 | sessionCurrentBindings :: Session -> STM (M.Map Identifier (Dynamic, UI))
sessionCurrentBindings (Session{..}) = readTVar sessionMap | 132 | sessionCurrentBindings (Session{..}) = readTVar sessionMap | 58 | false | true | 0 | 9 | 13 | 53 | 26 | 27 | null | null |
google/cabal2bazel | bzl/tests/rules/UnicodeLib.hs | apache-2.0 | α = 42 | 6 | α = 42 | 6 | α = 42 | 6 | false | false | 1 | 5 | 2 | 10 | 3 | 7 | null | null |
ndmitchell/shake | src/General/GetOpt.hs | bsd-3-clause | removeOverlap :: [OptDescr b] -> [OptDescr a] -> [OptDescr a]
removeOverlap bad = mapMaybe f
where
short = Set.fromList $ concat [x | Option x _ _ _ <- bad]
long = Set.fromList $ concat [x | Option _ x _ _ <- bad]
f (Option a b c d) | null a2 && null b2 = Nothing
| otherwise = Just $ Option a2 b2 c d
where a2 = filter (not . flip Set.member short) a
b2 = filter (not . flip Set.member long) b | 480 | removeOverlap :: [OptDescr b] -> [OptDescr a] -> [OptDescr a]
removeOverlap bad = mapMaybe f
where
short = Set.fromList $ concat [x | Option x _ _ _ <- bad]
long = Set.fromList $ concat [x | Option _ x _ _ <- bad]
f (Option a b c d) | null a2 && null b2 = Nothing
| otherwise = Just $ Option a2 b2 c d
where a2 = filter (not . flip Set.member short) a
b2 = filter (not . flip Set.member long) b | 480 | removeOverlap bad = mapMaybe f
where
short = Set.fromList $ concat [x | Option x _ _ _ <- bad]
long = Set.fromList $ concat [x | Option _ x _ _ <- bad]
f (Option a b c d) | null a2 && null b2 = Nothing
| otherwise = Just $ Option a2 b2 c d
where a2 = filter (not . flip Set.member short) a
b2 = filter (not . flip Set.member long) b | 418 | false | true | 0 | 13 | 172 | 221 | 107 | 114 | null | null |
Subsets and Splits
No community queries yet
The top public SQL queries from the community will appear here once available.