{-# LANGUAGE GADTs #-}
{-# LANGUAGE NamedFieldPuns #-}
{-# LANGUAGE NoRebindableSyntax #-}
{-# LANGUAGE OverloadedStrings #-}
module Duckling.Time.EN.Rules
( rules
) where
import Data.Maybe
import Data.Text (Text)
import Prelude
import qualified Data.Text as Text
import Duckling.Dimensions.Types
import Duckling.Duration.Helpers (duration)
import Duckling.Duration.Types (DurationData (..))
import Duckling.Numeral.Helpers (parseInt)
import Duckling.Numeral.Types (NumeralData (..))
import Duckling.Ordinal.Types (OrdinalData (..))
import Duckling.Regex.Types
import Duckling.Time.Helpers
import Duckling.Time.Types (TimeData (..))
import Duckling.Types
import qualified Duckling.Duration.Types as TDuration
import qualified Duckling.Numeral.Types as TNumeral
import qualified Duckling.Ordinal.Types as TOrdinal
import qualified Duckling.Time.Types as TTime
import qualified Duckling.TimeGrain.Types as TG
ruleIntersect :: Rule
ruleIntersect = Rule
{ name = "intersect"
, pattern =
[ Predicate isNotLatent
, Predicate isNotLatent
]
, prod = \tokens -> case tokens of
(Token Time td1:Token Time td2:_) -> Token Time <$> intersect td1 td2
_ -> Nothing
}
ruleIntersectOf :: Rule
ruleIntersectOf = Rule
{ name = "intersect by \",\", \"of\", \"from\", \"'s\""
, pattern =
[ Predicate isNotLatent
, regex "of|from|for|'s|,"
, Predicate isNotLatent
]
, prod = \tokens -> case tokens of
(Token Time td1:_:Token Time td2:_) -> Token Time <$> intersect td1 td2
_ -> Nothing
}
ruleAbsorbOnTime :: Rule
ruleAbsorbOnTime = Rule
{ name = "on <date>"
, pattern =
[ regex "on"
, dimension Time
]
, prod = \tokens -> case tokens of
(_:token:_) -> Just token
_ -> Nothing
}
ruleAbsorbOnADOW :: Rule
ruleAbsorbOnADOW = Rule
{ name = "on a <named-day>"
, pattern =
[ regex "on a"
, Predicate isADayOfWeek
]
, prod = \tokens -> case tokens of
(_:token:_) -> Just token
_ -> Nothing
}
ruleAbsorbInMonth :: Rule
ruleAbsorbInMonth = Rule
{ name = "in <named-month>"
, pattern =
[ regex "in"
, Predicate isAMonth
]
, prod = \tokens -> case tokens of
(_:token:_) -> Just token
_ -> Nothing
}
ruleAbsorbCommaTOD :: Rule
ruleAbsorbCommaTOD = Rule
{ name = "absorption of , after named day"
, pattern =
[ Predicate isADayOfWeek
, regex ","
]
, prod = \tokens -> case tokens of
(token:_) -> Just token
_ -> Nothing
}
ruleInstants :: [Rule]
ruleInstants = mkRuleInstants
[ ("right now" , TG.Second, 0 , "((just|right)\\s*)now|immediately")
, ("today" , TG.Day , 0 , "todays?|(at this time)" )
, ("tomorrow" , TG.Day , 1 , "(tmrw?|tomm?or?rows?)" )
, ("yesterday" , TG.Day , - 1, "yesterdays?" )
, ("end of month" , TG.Month , 1 , "(the )?(EOM|end of (the )?month)" )
, ("end of year" , TG.Year , 1 , "(the )?(EOY|end of (the )?year)" )
]
ruleNow :: Rule
ruleNow = Rule
{ name = "now"
, pattern =
[ regex "now"
]
, prod = \_ -> tt now
}
ruleNextDOW :: Rule
ruleNextDOW = Rule
{ name = "this|next <day-of-week>"
, pattern =
[ regex "this|next"
, Predicate isADayOfWeek
]
, prod = \tokens -> case tokens of
(_:Token Time td:_) -> tt $ predNth 0 True td
_ -> Nothing
}
ruleThisTime :: Rule
ruleThisTime = Rule
{ name = "this <time>"
, pattern =
[ regex "this|current|coming"
, Predicate isOkWithThisNext
]
, prod = \tokens -> case tokens of
(_:Token Time td:_) -> tt $ predNth 0 False td
_ -> Nothing
}
ruleNextTime :: Rule
ruleNextTime = Rule
{ name = "next <time>"
, pattern =
[ regex "next"
, Predicate isOkWithThisNext
]
, prod = \tokens -> case tokens of
(_:Token Time td:_) -> tt $ predNth 0 True td
_ -> Nothing
}
ruleLastTime :: Rule
ruleLastTime = Rule
{ name = "last <time>"
, pattern =
[ regex "(this past|last|previous)"
, Predicate isOkWithThisNext
]
, prod = \tokens -> case tokens of
(_:Token Time td:_) -> tt $ predNth (- 1) False td
_ -> Nothing
}
ruleLastWeekendOfMonth :: Rule
ruleLastWeekendOfMonth = Rule
{ name = "last weekend of <named-month>"
, pattern =
[ regex "last\\s(week(\\s|-)?end|wkend)\\s(of|in)"
, Predicate isAMonth
]
, prod = \tokens -> case tokens of
(_:Token Time td2:_) -> tt $ predLastOf weekend td2
_ -> Nothing
}
ruleTimeBeforeLastAfterNext :: Rule
ruleTimeBeforeLastAfterNext = Rule
{ name = "<time> before last|after next"
, pattern =
[ dimension Time
, regex "(before last|after next)"
]
, prod = \tokens -> case tokens of
(Token Time td:Token RegexMatch (GroupMatch (match:_)):_) ->
tt $ predNth 1 (Text.toLower match == "after next") td
_ -> Nothing
}
ruleLastDOWOfTime :: Rule
ruleLastDOWOfTime = Rule
{ name = "last <day-of-week> of <time>"
, pattern =
[ regex "last"
, Predicate isADayOfWeek
, regex "of"
, dimension Time
]
, prod = \tokens -> case tokens of
(_:Token Time td1:_:Token Time td2:_) ->
tt $ predLastOf td1 td2
_ -> Nothing
}
ruleLastCycleOfTime :: Rule
ruleLastCycleOfTime = Rule
{ name = "last <cycle> of <time>"
, pattern =
[ regex "last"
, dimension TimeGrain
, regex "of|in"
, dimension Time
]
, prod = \tokens -> case tokens of
(_:Token TimeGrain grain:_:Token Time td:_) ->
tt $ cycleLastOf grain td
_ -> Nothing
}
ruleNthTimeOfTime :: Rule
ruleNthTimeOfTime = Rule
{ name = "nth <time> of <time>"
, pattern =
[ dimension Ordinal
, dimension Time
, regex "of|in"
, dimension Time
]
, prod = \tokens -> case tokens of
(Token Ordinal od:Token Time td1:_:Token Time td2:_) -> Token Time .
predNth (TOrdinal.value od - 1) False <$> intersect td2 td1
_ -> Nothing
}
ruleTheNthTimeOfTime :: Rule
ruleTheNthTimeOfTime = Rule
{ name = "the nth <time> of <time>"
, pattern =
[ regex "the"
, dimension Ordinal
, dimension Time
, regex "of|in"
, dimension Time
]
, prod = \tokens -> case tokens of
(_:Token Ordinal od:Token Time td1:_:Token Time td2:_) -> Token Time .
predNth (TOrdinal.value od - 1) False <$> intersect td2 td1
_ -> Nothing
}
ruleNthTimeAfterTime :: Rule
ruleNthTimeAfterTime = Rule
{ name = "nth <time> after <time>"
, pattern =
[ dimension Ordinal
, dimension Time
, regex "after"
, dimension Time
]
, prod = \tokens -> case tokens of
(Token Ordinal od:Token Time td1:_:Token Time td2:_) ->
tt $ predNthAfter (TOrdinal.value od - 1) td1 td2
_ -> Nothing
}
ruleTheNthTimeAfterTime :: Rule
ruleTheNthTimeAfterTime = Rule
{ name = "the nth <time> after <time>"
, pattern =
[ regex "the"
, dimension Ordinal
, dimension Time
, regex "after"
, dimension Time
]
, prod = \tokens -> case tokens of
(_:Token Ordinal od:Token Time td1:_:Token Time td2:_) ->
tt $ predNthAfter (TOrdinal.value od - 1) td1 td2
_ -> Nothing
}
ruleYear :: Rule
ruleYear = Rule
{ name = "year"
, pattern = [Predicate $ isIntegerBetween 1000 2100]
, prod = \tokens -> case tokens of
(token:_) -> do
n <- getIntValue token
tt $ year n
_ -> Nothing
}
ruleYearPastLatent :: Rule
ruleYearPastLatent = Rule
{ name = "past year (latent)"
, pattern =
[ Predicate $
or . sequence [isIntegerBetween (- 10000) 0, isIntegerBetween 25 999]
]
, prod = \tokens -> case tokens of
(token:_) -> do
n <- getIntValue token
tt . mkLatent $ year n
_ -> Nothing
}
ruleYearFutureLatent :: Rule
ruleYearFutureLatent = Rule
{ name = "future year (latent)"
, pattern = [Predicate $ isIntegerBetween 2101 10000]
, prod = \tokens -> case tokens of
(token:_) -> do
n <- getIntValue token
tt . mkLatent $ year n
_ -> Nothing
}
ruleDOMLatent :: Rule
ruleDOMLatent = Rule
{ name = "<day-of-month> (ordinal)"
, pattern = [Predicate isDOMOrdinal]
, prod = \tokens -> case tokens of
(token:_) -> do
n <- getIntValue token
tt . mkLatent $ dayOfMonth n
_ -> Nothing
}
ruleTheDOMNumeral :: Rule
ruleTheDOMNumeral = Rule
{ name = "the <day-of-month> (number)"
, pattern =
[ regex "the"
, Predicate isDOMInteger
]
, prod = \tokens -> case tokens of
(_:token:_) -> do
n <- getIntValue token
tt . mkLatent $ dayOfMonth n
_ -> Nothing
}
ruleTheDOMOrdinal :: Rule
ruleTheDOMOrdinal = Rule
{ name = "the <day-of-month> (ordinal)"
, pattern =
[ regex "the"
, Predicate isDOMOrdinal
]
, prod = \tokens -> case tokens of
(_:
Token Ordinal OrdinalData{TOrdinal.value = v}:
_) -> tt $ dayOfMonth v
_ -> Nothing
}
ruleNamedDOMOrdinal :: Rule
ruleNamedDOMOrdinal = Rule
{ name = "<named-month>|<named-day> <day-of-month> (ordinal)"
, pattern =
[ Predicate $ or . sequence [isAMonth, isADayOfWeek]
, Predicate isDOMOrdinal
]
, prod = \tokens -> case tokens of
(Token Time td:token:_) -> Token Time <$> intersectDOM td token
_ -> Nothing
}
ruleMonthDOMNumeral :: Rule
ruleMonthDOMNumeral = Rule
{ name = "<named-month> <day-of-month> (non ordinal)"
, pattern =
[ Predicate isAMonth
, Predicate isDOMInteger
]
, prod = \tokens -> case tokens of
(Token Time td:token:_) -> Token Time <$> intersectDOM td token
_ -> Nothing
}
ruleDOMOfMonth :: Rule
ruleDOMOfMonth = Rule
{ name = "<day-of-month> (ordinal or number) of <named-month>"
, pattern =
[ Predicate isDOMValue
, regex "of|in"
, Predicate isAMonth
]
, prod = \tokens -> case tokens of
(token:_:Token Time td:_) -> Token Time <$> intersectDOM td token
_ -> Nothing
}
ruleDOMMonth :: Rule
ruleDOMMonth = Rule
{ name = "<day-of-month> (ordinal or number) <named-month>"
, pattern =
[ Predicate isDOMValue
, Predicate isAMonth
]
, prod = \tokens -> case tokens of
(token:Token Time td:_) -> Token Time <$> intersectDOM td token
_ -> Nothing
}
ruleDOMOrdinalMonthYear :: Rule
ruleDOMOrdinalMonthYear = Rule
{ name = "<day-of-month>(ordinal) <named-month> year"
, pattern =
[ Predicate isDOMOrdinal
, Predicate isAMonth
, regex "(\\d{2,4})"
]
, prod = \tokens -> case tokens of
(token:Token Time td:Token RegexMatch (GroupMatch (match:_)):_) -> do
intVal <- parseInt match
dom <- intersectDOM td token
Token Time <$> intersect dom (year intVal)
_ -> Nothing
}
ruleIdesOfMonth :: Rule
ruleIdesOfMonth = Rule
{ name = "the ides of <named-month>"
, pattern =
[ regex "the ides? of"
, Predicate isAMonth
]
, prod = \tokens -> case tokens of
(_:Token Time td@TimeData {TTime.form = Just (TTime.Month m)}:_) ->
Token Time <$>
intersect td (dayOfMonth $ if elem m [3, 5, 7, 10] then 15 else 13)
_ -> Nothing
}
ruleTODLatent :: Rule
ruleTODLatent = Rule
{ name = "time-of-day (latent)"
, pattern =
[ Predicate $ isIntegerBetween 0 23
]
, prod = \tokens -> case tokens of
(token:_) -> do
n <- getIntValue token
tt . mkLatent $ hour True n
_ -> Nothing
}
ruleAtTOD :: Rule
ruleAtTOD = Rule
{ name = "at <time-of-day>"
, pattern =
[ regex "at|@"
, Predicate isATimeOfDay
]
, prod = \tokens -> case tokens of
(_:Token Time td:_) -> tt $ notLatent td
_ -> Nothing
}
ruleTODOClock :: Rule
ruleTODOClock = Rule
{ name = "<time-of-day> o'clock"
, pattern =
[ Predicate isATimeOfDay
, regex "o.?clock"
]
, prod = \tokens -> case tokens of
(Token Time td:_) -> tt $ notLatent td
_ -> Nothing
}
ruleHHMM :: Rule
ruleHHMM = Rule
{ name = "hh:mm"
, pattern = [regex "((?:[01]?\\d)|(?:2[0-3]))[:.]([0-5]\\d)"]
, prod = \tokens -> case tokens of
(Token RegexMatch (GroupMatch (hh:mm:_)):_) -> do
h <- parseInt hh
m <- parseInt mm
tt $ hourMinute True h m
_ -> Nothing
}
ruleHHMMLatent :: Rule
ruleHHMMLatent = Rule
{ name = "hhmm (latent)"
, pattern =
[ regex "((?:[01]?\\d)|(?:2[0-3]))([0-5]\\d)(?!.\\d)"
]
, prod = \tokens -> case tokens of
(Token RegexMatch (GroupMatch (hh:mm:_)):_) -> do
h <- parseInt hh
m <- parseInt mm
tt . mkLatent $ hourMinute True h m
_ -> Nothing
}
ruleHHMMSS :: Rule
ruleHHMMSS = Rule
{ name = "hh:mm:ss"
, pattern = [regex "((?:[01]?\\d)|(?:2[0-3]))[:.]([0-5]\\d)[:.]([0-5]\\d)"]
, prod = \tokens -> case tokens of
(Token RegexMatch (GroupMatch (hh:mm:ss:_)):_) -> do
h <- parseInt hh
m <- parseInt mm
s <- parseInt ss
tt $ hourMinuteSecond True h m s
_ -> Nothing
}
ruleMilitaryAMPM :: Rule
ruleMilitaryAMPM = Rule
{ name = "hhmm (military) am|pm"
, pattern =
[ regex "((?:1[012]|0?\\d))([0-5]\\d)"
, regex "([ap])\\.?m?\\.?"
]
, prod = \tokens -> case tokens of
(Token RegexMatch (GroupMatch (hh:mm:_)):
Token RegexMatch (GroupMatch (ap:_)):
_) -> do
h <- parseInt hh
m <- parseInt mm
tt . timeOfDayAMPM (Text.toLower ap == "a") $ hourMinute True h m
_ -> Nothing
}
ruleMilitarySpelledOutAMPM :: Rule
ruleMilitarySpelledOutAMPM = Rule
{ name = "military spelled out numbers am|pm"
, pattern =
[ Predicate $ isIntegerBetween 10 12
, Predicate $ isIntegerBetween 1 59
, regex "(in the )?([ap])(\\s|\\.)?m?\\.?"
]
, prod = \tokens -> case tokens of
(h:m:Token RegexMatch (GroupMatch (_:ap:_)):_) -> do
hh <- getIntValue h
mm <- getIntValue m
tt . timeOfDayAMPM (Text.toLower ap == "a") $ hourMinute True hh mm
_ -> Nothing
}
ruleMilitarySpelledOutAMPM2 :: Rule
ruleMilitarySpelledOutAMPM2 = Rule
{ name = "six thirty six a.m."
, pattern =
[ Predicate $ isIntegerBetween 110 999
, regex "(in the )?([ap])(\\s|\\.)?m?\\.?"
]
, prod = \tokens -> case tokens of
(token:Token RegexMatch (GroupMatch (_:ap:_)):_) -> do
n <- getIntValue token
m <- case mod n 100 of
v | v < 60 -> Just v
_ -> Nothing
let h = quot n 100
tt . timeOfDayAMPM (Text.toLower ap == "a") $ hourMinute True h m
_ -> Nothing
}
ruleTODAMPM :: Rule
ruleTODAMPM = Rule
{ name = "<time-of-day> am|pm"
, pattern =
[ Predicate isATimeOfDay
, regex "(in the )?([ap])(\\s|\\.)?m?\\.?"
]
, prod = \tokens -> case tokens of
(Token Time td:Token RegexMatch (GroupMatch (_:ap:_)):_) ->
tt $ timeOfDayAMPM (Text.toLower ap == "a") td
_ -> Nothing
}
ruleHONumeral :: Rule
ruleHONumeral = Rule
{ name = "<hour-of-day> <integer>"
, pattern =
[ Predicate $ and . sequence [isNotLatent, isAnHourOfDay]
, Predicate $ isIntegerBetween 1 59
]
, prod = \tokens -> case tokens of
(Token Time TimeData {TTime.form = Just (TTime.TimeOfDay (Just hours) is12H)}:
token:
_) -> do
n <- getIntValue token
tt $ hourMinute is12H hours n
_ -> Nothing
}
ruleHODHalf :: Rule
ruleHODHalf = Rule
{ name = "<hour-of-day> half"
, pattern =
[ Predicate isAnHourOfDay
, regex "half"
]
, prod = \tokens -> case tokens of
(Token Time TimeData {TTime.form = Just (TTime.TimeOfDay (Just hours) is12H)}:_) ->
tt $ hourMinute is12H hours 30
_ -> Nothing
}
ruleHODQuarter :: Rule
ruleHODQuarter = Rule
{ name = "<hour-of-day> quarter"
, pattern =
[ Predicate isAnHourOfDay
, regex "(a|one)? ?quarter"
]
, prod = \tokens -> case tokens of
(Token Time TimeData {TTime.form = Just (TTime.TimeOfDay (Just hours) is12H)}:_) ->
tt $ hourMinute is12H hours 15
_ -> Nothing
}
ruleNumeralToHOD :: Rule
ruleNumeralToHOD = Rule
{ name = "<integer> to|till|before <hour-of-day>"
, pattern =
[ Predicate $ isIntegerBetween 1 59
, regex "to|till|before|of"
, Predicate isAnHourOfDay
]
, prod = \tokens -> case tokens of
(token:_:Token Time td:_) -> do
n <- getIntValue token
t <- minutesBefore n td
Just $ Token Time t
_ -> Nothing
}
ruleHalfToHOD :: Rule
ruleHalfToHOD = Rule
{ name = "half to|till|before <hour-of-day>"
, pattern =
[ regex "half (to|till|before|of)"
, Predicate isAnHourOfDay
]
, prod = \tokens -> case tokens of
(_:Token Time td:_) -> Token Time <$> minutesBefore 30 td
_ -> Nothing
}
ruleQuarterToHOD :: Rule
ruleQuarterToHOD = Rule
{ name = "quarter to|till|before <hour-of-day>"
, pattern =
[ regex "(a|one)? ?quarter (to|till|before|of)"
, Predicate isAnHourOfDay
]
, prod = \tokens -> case tokens of
(_:Token Time td:_) -> Token Time <$> minutesBefore 15 td
_ -> Nothing
}
ruleNumeralAfterHOD :: Rule
ruleNumeralAfterHOD = Rule
{ name = "integer after|past <hour-of-day>"
, pattern =
[ Predicate $ isIntegerBetween 1 59
, regex "after|past"
, Predicate isAnHourOfDay
]
, prod = \tokens -> case tokens of
(token:_:Token Time td:_) -> do
n <- getIntValue token
t <- minutesAfter n td
Just $ Token Time t
_ -> Nothing
}
ruleHalfAfterHOD :: Rule
ruleHalfAfterHOD = Rule
{ name = "half after|past <hour-of-day>"
, pattern =
[ regex "half (after|past)"
, Predicate isAnHourOfDay
]
, prod = \tokens -> case tokens of
(_:Token Time td:_) -> Token Time <$> minutesAfter 30 td
_ -> Nothing
}
ruleQuarterAfterHOD :: Rule
ruleQuarterAfterHOD = Rule
{ name = "quarter after|past <hour-of-day>"
, pattern =
[ regex "(a|one)? ?quarter (after|past)"
, Predicate isAnHourOfDay
]
, prod = \tokens -> case tokens of
(_:Token Time td:_) -> Token Time <$> minutesAfter 15 td
_ -> Nothing
}
ruleHalfHOD :: Rule
ruleHalfHOD = Rule
{ name = "half <integer> (UK style hour-of-day)"
, pattern =
[ regex "half"
, Predicate isAnHourOfDay
]
, prod = \tokens -> case tokens of
(_:Token Time td:_) -> Token Time <$> minutesAfter 30 td
_ -> Nothing
}
ruleMMYYYY :: Rule
ruleMMYYYY = Rule
{ name = "mm/yyyy"
, pattern =
[ regex "(0?[1-9]|1[0-2])[/-](\\d{4})"
]
, prod = \tokens -> case tokens of
(Token RegexMatch (GroupMatch (mm:yy:_)):_) -> do
y <- parseInt yy
m <- parseInt mm
tt $ yearMonthDay y m 1
_ -> Nothing
}
ruleYYYYMMDD :: Rule
ruleYYYYMMDD = Rule
{ name = "yyyy-mm-dd"
, pattern =
[ regex "(\\d{2,4})-(0?[1-9]|1[0-2])-(3[01]|[12]\\d|0?[1-9])"
]
, prod = \tokens -> case tokens of
(Token RegexMatch (GroupMatch (yy:mm:dd:_)):_) -> do
y <- parseInt yy
m <- parseInt mm
d <- parseInt dd
tt $ yearMonthDay y m d
_ -> Nothing
}
ruleNoonMidnightEOD :: Rule
ruleNoonMidnightEOD = Rule
{ name = "noon|midnight|EOD|end of day"
, pattern =
[ regex "(noon|midni(ght|te)|(the )?(EOD|end of (the )?day))"
]
, prod = \tokens -> case tokens of
(Token RegexMatch (GroupMatch (match:_)):_) -> tt . hour False $
if Text.toLower match == "noon" then 12 else 0
_ -> Nothing
}
rulePartOfDays :: Rule
rulePartOfDays = Rule
{ name = "part of days"
, pattern =
[ regex "(morning|after ?noo?n(ish)?|evening|night|(at )?lunch)"
]
, prod = \tokens -> case tokens of
(Token RegexMatch (GroupMatch (match:_)):_) -> do
let (start, end) = case Text.toLower match of
"morning" -> (hour False 4, hour False 12)
"evening" -> (hour False 18, hour False 0)
"night" -> (hour False 18, hour False 0)
"lunch" -> (hour False 12, hour False 14)
"at lunch" -> (hour False 12, hour False 14)
_ -> (hour False 12, hour False 19)
td <- interval TTime.Open start end
tt . partOfDay $ mkLatent td
_ -> Nothing
}
ruleEarlyMorning :: Rule
ruleEarlyMorning = Rule
{ name = "early morning"
, pattern =
[ regex "early ((in|hours of) the )?morning"
]
, prod = \_ -> Token Time . partOfDay . mkLatent <$>
interval TTime.Open (hour False 4) (hour False 9)
}
rulePODIn :: Rule
rulePODIn = Rule
{ name = "in|during the <part-of-day>"
, pattern =
[ regex "(in|during)( the)?"
, Predicate isAPartOfDay
]
, prod = \tokens -> case tokens of
(_:Token Time td:_) -> tt $ notLatent td
_ -> Nothing
}
rulePODThis :: Rule
rulePODThis = Rule
{ name = "this <part-of-day>"
, pattern =
[ regex "this"
, Predicate isAPartOfDay
]
, prod = \tokens -> case tokens of
(_:Token Time td:_) -> Token Time . partOfDay . notLatent <$>
intersect (cycleNth TG.Day 0) td
_ -> Nothing
}
ruleTonight :: Rule
ruleTonight = Rule
{ name = "tonight"
, pattern = [regex "toni(ght|gth|te)s?"]
, prod = \_ -> do
let today = cycleNth TG.Day 0
evening <- interval TTime.Open (hour False 18) (hour False 0)
Token Time . partOfDay . notLatent <$> intersect today evening
}
ruleAfterPartofday :: Rule
ruleAfterPartofday = Rule
{ name = "after lunch/work/school"
, pattern =
[ regex "after[\\s-]?(lunch|work|school)"
]
, prod = \tokens -> case tokens of
(Token RegexMatch (GroupMatch (match:_)):_) -> do
(start, end) <- case Text.toLower match of
"lunch" -> Just (hour False 13, hour False 17)
"work" -> Just (hour False 17, hour False 21)
"school" -> Just (hour False 15, hour False 21)
_ -> Nothing
td <- interval TTime.Open start end
Token Time . partOfDay . notLatent <$>
intersect (cycleNth TG.Day 0) td
_ -> Nothing
}
ruleTimePOD :: Rule
ruleTimePOD = Rule
{ name = "<time> <part-of-day>"
, pattern =
[ dimension Time
, Predicate isAPartOfDay
]
, prod = \tokens -> case tokens of
(Token Time td:Token Time pod:_) -> Token Time <$> intersect pod td
_ -> Nothing
}
rulePODofTime :: Rule
rulePODofTime = Rule
{ name = "<part-of-day> of <time>"
, pattern =
[ Predicate isAPartOfDay
, regex "of"
, dimension Time
]
, prod = \tokens -> case tokens of
(Token Time pod:_:Token Time td:_) -> Token Time <$> intersect pod td
_ -> Nothing
}
ruleWeekend :: Rule
ruleWeekend = Rule
{ name = "week-end"
, pattern =
[ regex "(week(\\s|-)?end|wkend)s?"
]
, prod = \_ -> tt $ mkOkForThisNext weekend
}
ruleSeasons :: [Rule]
ruleSeasons = mkRuleSeasons
[ ( "summer", "summer" , monthDay 6 21, monthDay 9 23 )
, ( "fall" , "fall|autumn", monthDay 9 23, monthDay 12 21 )
, ( "winter", "winter" , monthDay 12 21, monthDay 3 20 )
, ( "spring", "spring" , monthDay 3 20, monthDay 6 21 )
]
ruleTODPrecision :: Rule
ruleTODPrecision = Rule
{ name = "<time-of-day> sharp|exactly"
, pattern =
[ Predicate isATimeOfDay
, regex "(sharp|exactly|-?ish|approximately)"
]
, prod = \tokens -> case tokens of
(Token Time td:_) -> tt $ notLatent td
_ -> Nothing
}
rulePrecisionTOD :: Rule
rulePrecisionTOD = Rule
{ name = "about|exactly <time-of-day>"
, pattern =
[ regex "(about|around|approximately|exactly)"
, Predicate $ isGrainFinerThan TG.Year
]
, prod = \tokens -> case tokens of
(_:Token Time td:_) -> tt $ notLatent td
_ -> Nothing
}
ruleIntervalMonthDDDD :: Rule
ruleIntervalMonthDDDD = Rule
{ name = "<month> dd-dd (interval)"
, pattern =
[ Predicate isAMonth
, Predicate isDOMValue
, regex "\\-|to|th?ru|through|(un)?til(l)?"
, Predicate isDOMValue
]
, prod = \tokens -> case tokens of
(Token Time td:
token1:
_:
token2:
_) -> do
dom1 <- intersectDOM td token1
dom2 <- intersectDOM td token2
Token Time <$> interval TTime.Closed dom1 dom2
_ -> Nothing
}
ruleIntervalDDDDMonth :: Rule
ruleIntervalDDDDMonth = Rule
{ name = "dd-dd <month> (interval)"
, pattern =
[ Predicate isDOMValue
, regex "\\-|to|th?ru|through|(un)?til(l)?"
, Predicate isDOMValue
, Predicate isAMonth
]
, prod = \tokens -> case tokens of
(token1:
_:
token2:
Token Time td:
_) -> do
dom1 <- intersectDOM td token1
dom2 <- intersectDOM td token2
Token Time <$> interval TTime.Closed dom1 dom2
_ -> Nothing
}
ruleIntervalFromMonthDDDD :: Rule
ruleIntervalFromMonthDDDD = Rule
{ name = "from <month> dd-dd (interval)"
, pattern =
[ regex "from"
, Predicate isAMonth
, Predicate isDOMValue
, regex "\\-|to|th?ru|through|(un)?til(l)?"
, Predicate isDOMValue
]
, prod = \tokens -> case tokens of
(_:
Token Time td:
token1:
_:
token2:
_) -> do
dom1 <- intersectDOM td token1
dom2 <- intersectDOM td token2
Token Time <$> interval TTime.Closed dom1 dom2
_ -> Nothing
}
ruleIntervalFromDDDDMonth :: Rule
ruleIntervalFromDDDDMonth = Rule
{ name = "from <day-of-month> (ordinal or number) to <day-of-month> (ordinal or number) <named-month> (interval)"
, pattern =
[ regex "from"
, Predicate isDOMValue
, regex "\\-|to|th?ru|through|(un)?til(l)?"
, Predicate isDOMValue
, Predicate isAMonth
]
, prod = \tokens -> case tokens of
(_:
token1:
_:
token2:
Token Time td:
_) -> do
dom1 <- intersectDOM td token1
dom2 <- intersectDOM td token2
Token Time <$> interval TTime.Closed dom1 dom2
_ -> Nothing
}
ruleIntervalDash :: Rule
ruleIntervalDash = Rule
{ name = "<datetime> - <datetime> (interval)"
, pattern =
[ Predicate isNotLatent
, regex "\\-|to|th?ru|through|(un)?til(l)?"
, Predicate isNotLatent
]
, prod = \tokens -> case tokens of
(Token Time td1:_:Token Time td2:_) ->
Token Time <$> interval TTime.Closed td1 td2
_ -> Nothing
}
ruleIntervalFrom :: Rule
ruleIntervalFrom = Rule
{ name = "from <datetime> - <datetime> (interval)"
, pattern =
[ regex "from"
, dimension Time
, regex "\\-|to|th?ru|through|(un)?til(l)?"
, dimension Time
]
, prod = \tokens -> case tokens of
(_:Token Time td1:_:Token Time td2:_) ->
Token Time <$> interval TTime.Closed td1 td2
_ -> Nothing
}
ruleIntervalBetween :: Rule
ruleIntervalBetween = Rule
{ name = "between <time> and <time>"
, pattern =
[ regex "between"
, dimension Time
, regex "and"
, dimension Time
]
, prod = \tokens -> case tokens of
(_:Token Time td1:_:Token Time td2:_) ->
Token Time <$> interval TTime.Closed td1 td2
_ -> Nothing
}
ruleIntervalTODDash :: Rule
ruleIntervalTODDash = Rule
{ name = "<time-of-day> - <time-of-day> (interval)"
, pattern =
[ Predicate $ and . sequence [isNotLatent, isATimeOfDay]
, regex "\\-|:|to|th?ru|through|(un)?til(l)?"
, Predicate isATimeOfDay
]
, prod = \tokens -> case tokens of
(Token Time td1:_:Token Time td2:_) ->
Token Time <$> interval TTime.Closed td1 td2
_ -> Nothing
}
ruleIntervalTODFrom :: Rule
ruleIntervalTODFrom = Rule
{ name = "from <time-of-day> - <time-of-day> (interval)"
, pattern =
[ regex "(later than|from|(in[\\s-])?between)"
, Predicate isATimeOfDay
, regex "((but )?before)|\\-|to|th?ru|through|(un)?til(l)?"
, Predicate isATimeOfDay
]
, prod = \tokens -> case tokens of
(_:Token Time td1:_:Token Time td2:_) ->
Token Time <$> interval TTime.Closed td1 td2
_ -> Nothing
}
ruleIntervalTODAMPM :: Rule
ruleIntervalTODAMPM = Rule
{ name = "hh(:mm) - <time-of-day> am|pm"
, pattern =
[ regex "(?:from )?((?:[01]?\\d)|(?:2[0-3]))([:.]([0-5]\\d))?"
, regex "\\-|:|to|th?ru|through|(un)?til(l)?"
, Predicate isATimeOfDay
, regex "(in the )?([ap])(\\s|\\.)?m?\\.?"
]
, prod = \tokens -> case tokens of
(Token RegexMatch (GroupMatch (hh:_:mm:_)):
_:
Token Time td2:
Token RegexMatch (GroupMatch (_:ap:_)):
_) -> do
h <- parseInt hh
let ampm = Text.toLower ap == "a"
td1 = case parseInt mm of
Just m -> hourMinute True h m
Nothing -> hour True h
Token Time <$>
interval TTime.Closed (timeOfDayAMPM ampm td1) (timeOfDayAMPM ampm td2)
_ -> Nothing
}
ruleIntervalTODBetween :: Rule
ruleIntervalTODBetween = Rule
{ name = "between <time-of-day> and <time-of-day> (interval)"
, pattern =
[ regex "between"
, Predicate isATimeOfDay
, regex "and"
, Predicate isATimeOfDay
]
, prod = \tokens -> case tokens of
(_:Token Time td1:_:Token Time td2:_) ->
Token Time <$> interval TTime.Closed td1 td2
_ -> Nothing
}
ruleIntervalBy :: Rule
ruleIntervalBy = Rule
{ name = "by <time>"
, pattern =
[ regex "by"
, dimension Time
]
, prod = \tokens -> case tokens of
(_:Token Time td:_) ->
Token Time <$> interval TTime.Open (cycleNth TG.Second 0) td
_ -> Nothing
}
ruleIntervalByTheEndOf :: Rule
ruleIntervalByTheEndOf = Rule
{ name = "by the end of <time>"
, pattern =
[ regex "by (the )?end of"
, dimension Time
]
, prod = \tokens -> case tokens of
(_:Token Time td:_) ->
Token Time <$> interval TTime.Closed (cycleNth TG.Second 0) td
_ -> Nothing
}
ruleIntervalUntilTOD :: Rule
ruleIntervalUntilTOD = Rule
{ name = "until <time-of-day>"
, pattern =
[ regex "(anytime |sometimes? )?(before|(un)?til(l)?|through|up to)"
, dimension Time
]
, prod = \tokens -> case tokens of
(_:Token Time td:_) -> tt $ withDirection TTime.Before td
_ -> Nothing
}
ruleIntervalAfterFromSinceTOD :: Rule
ruleIntervalAfterFromSinceTOD = Rule
{ name = "from|since|after <time-of-day>"
, pattern =
[ regex "from|since|(anytime |sometimes? )?after"
, dimension Time
]
, prod = \tokens -> case tokens of
(_:Token Time td:_) -> tt $ withDirection TTime.After td
_ -> Nothing
}
ruleDaysOfWeek :: [Rule]
ruleDaysOfWeek = mkRuleDaysOfWeek
[ ( "Monday" , "monday|mon\\.?" )
, ( "Tuesday" , "tuesday|tues?\\.?" )
, ( "Wednesday", "wed?nesday|wed\\.?" )
, ( "Thursday" , "thursday|thu(rs?)?\\.?" )
, ( "Friday" , "friday|fri\\.?" )
, ( "Saturday" , "saturday|sat\\.?" )
, ( "Sunday" , "sunday|sun\\.?" )
]
ruleMonths :: [Rule]
ruleMonths = mkRuleMonths
[ ( "January" , "january|jan\\.?" )
, ( "February" , "february|feb\\.?" )
, ( "March" , "march|mar\\.?" )
, ( "April" , "april|apr\\.?" )
, ( "May" , "may" )
, ( "June" , "june|jun\\.?" )
, ( "July" , "july|jul\\.?" )
, ( "August" , "august|aug\\.?" )
, ( "September", "september|sept?\\.?" )
, ( "October" , "october|oct\\.?" )
, ( "November" , "november|nov\\.?" )
, ( "December" , "december|dec\\.?" )
]
rulePartOfMonth :: Rule
rulePartOfMonth = Rule
{ name = "part of <named-month>"
, pattern =
[ regex "(early|mid|late)-?( of)?"
, Predicate isAMonth
]
, prod = \tokens -> case tokens of
(Token RegexMatch (GroupMatch (match:_)):Token Time td:_) -> do
(sd, ed) <- case Text.toLower match of
"early" -> Just (1, 10)
"mid" -> Just (11, 20)
"late" -> Just (21, -1)
_ -> Nothing
start <- intersect td $ dayOfMonth sd
end <- if ed /= -1
then intersect td $ dayOfMonth ed
else Just $ cycleLastOf TG.Day td
Token Time <$> interval TTime.Open start end
_ -> Nothing
}
ruleUSHolidays :: [Rule]
ruleUSHolidays = mkRuleHolidays
[ ( "Christmas" , "(xmas|christmas)( day)?" , monthDay 12 25 )
, ( "Christmas Eve" , "(xmas|christmas)( day)?('s)? eve", monthDay 12 24 )
, ( "New Year's Eve" , "new year'?s? eve" , monthDay 12 31 )
, ( "New Year's Day" , "new year'?s?( day)?" , monthDay 1 1 )
, ( "Valentine's Day" , "valentine'?s?( day)?" , monthDay 2 14 )
, ( "Independence Day", "independence day" , monthDay 7 4 )
, ( "Halloween" , "hall?owe?en( day)?" , monthDay 10 31 )
, ( "Martin Luther King's Day"
, "(MLK|Martin Luther King,?)( Jr.?| Junior)? day"
, nthDOWOfMonth 3 1 1
)
, ( "Father's Day" , "father'?s?'? day", nthDOWOfMonth 3 7 6 )
, ( "Mother's Day" , "mother'?s?'? day", nthDOWOfMonth 2 7 5 )
, ( "Labor Day" , "labor day" , nthDOWOfMonth 1 1 9 )
, ( "Black Friday", "black frid?day"
, cycleNthAfter False TG.Day 1 $ nthDOWOfMonth 4 4 11
)
, ( "Memorial Day", "memorial day", predLastOf (dayOfWeek 1) (month 5) )
, ( "Memorial Day weekend", "memorial day week(\\s|-)?ends?"
, longWEBefore $ predLastOf (dayOfWeek 1) (month 5)
)
, ( "Labor Day weekend", "labor day week(\\s|-)?ends?"
, longWEBefore $ nthDOWOfMonth 1 1 9
)
]
ruleCycleThisLastNext :: Rule
ruleCycleThisLastNext = Rule
{ name = "this|last|next <cycle>"
, pattern =
[ regex "(this|current|coming|next|the following|last|past|previous)"
, dimension TimeGrain
]
, prod = \tokens -> case tokens of
(Token RegexMatch (GroupMatch (match:_)):Token TimeGrain grain:_) ->
case Text.toLower match of
"this" -> tt $ cycleNth grain 0
"coming" -> tt $ cycleNth grain 0
"current" -> tt $ cycleNth grain 0
"last" -> tt . cycleNth grain $ - 1
"past" -> tt . cycleNth grain $ - 1
"previous" -> tt . cycleNth grain $ - 1
"next" -> tt $ cycleNth grain 1
"the following" -> tt $ cycleNth grain 1
_ -> Nothing
_ -> Nothing
}
ruleCycleTheAfterBeforeTime :: Rule
ruleCycleTheAfterBeforeTime = Rule
{ name = "the <cycle> after|before <time>"
, pattern =
[ regex "the"
, dimension TimeGrain
, regex "(after|before)"
, dimension Time
]
, prod = \tokens -> case tokens of
( _
: Token TimeGrain grain
: Token RegexMatch (GroupMatch (match:_))
: Token Time td
: _) ->
let n = if Text.toLower match == "after" then 1 else - 1 in
tt $ cycleNthAfter False grain n td
_ -> Nothing
}
ruleCycleAfterBeforeTime :: Rule
ruleCycleAfterBeforeTime = Rule
{ name = "<cycle> after|before <time>"
, pattern =
[ dimension TimeGrain
, regex "(after|before)"
, dimension Time
]
, prod = \tokens -> case tokens of
(Token TimeGrain grain:
Token RegexMatch (GroupMatch (match:_)):
Token Time td:
_) ->
let n = if Text.toLower match == "after" then 1 else - 1 in
tt $ cycleNthAfter False grain n td
_ -> Nothing
}
ruleCycleOrdinalOfTime :: Rule
ruleCycleOrdinalOfTime = Rule
{ name = "<ordinal> <cycle> of <time>"
, pattern =
[ dimension Ordinal
, dimension TimeGrain
, regex "of|in|from"
, dimension Time
]
, prod = \tokens -> case tokens of
(token:Token TimeGrain grain:_:Token Time td:_) -> do
n <- getIntValue token
tt $ cycleNthAfter True grain (n - 1) td
_ -> Nothing
}
ruleCycleTheOrdinalOfTime :: Rule
ruleCycleTheOrdinalOfTime = Rule
{ name = "the <ordinal> <cycle> of <time>"
, pattern =
[ regex "the"
, dimension Ordinal
, dimension TimeGrain
, regex "of|in|from"
, dimension Time
]
, prod = \tokens -> case tokens of
(_:token:Token TimeGrain grain:_:Token Time td:_) -> do
n <- getIntValue token
tt $ cycleNthAfter True grain (n - 1) td
_ -> Nothing
}
ruleCycleTheOfTime :: Rule
ruleCycleTheOfTime = Rule
{ name = "the <cycle> of <time>"
, pattern =
[ regex "the"
, dimension TimeGrain
, regex "of"
, dimension Time
]
, prod = \tokens -> case tokens of
(_:Token TimeGrain grain:_:Token Time td:_) ->
tt $ cycleNthAfter True grain 0 td
_ -> Nothing
}
ruleCycleOrdinalAfterTime :: Rule
ruleCycleOrdinalAfterTime = Rule
{ name = "<ordinal> <cycle> after <time>"
, pattern =
[ dimension Ordinal
, dimension TimeGrain
, regex "after"
, dimension Time
]
, prod = \tokens -> case tokens of
(token:Token TimeGrain grain:_:Token Time td:_) -> do
n <- getIntValue token
tt $ cycleNthAfter True grain (n - 1) td
_ -> Nothing
}
ruleCycleTheOrdinalAfterTime :: Rule
ruleCycleTheOrdinalAfterTime = Rule
{ name = "<ordinal> <cycle> after <time>"
, pattern =
[ regex "the"
, dimension Ordinal
, dimension TimeGrain
, regex "after"
, dimension Time
]
, prod = \tokens -> case tokens of
(_:token:Token TimeGrain grain:_:Token Time td:_) -> do
n <- getIntValue token
tt $ cycleNthAfter True grain (n - 1) td
_ -> Nothing
}
ruleCycleOrdinalQuarter :: Rule
ruleCycleOrdinalQuarter = Rule
{ name = "<ordinal> quarter"
, pattern =
[ dimension Ordinal
, Predicate $ isGrain TG.Quarter
]
, prod = \tokens -> case tokens of
(token:_) -> do
n <- getIntValue token
tt . cycleNthAfter True TG.Quarter (n - 1) $
cycleNth TG.Year 0
_ -> Nothing
}
ruleCycleTheOrdinalQuarter :: Rule
ruleCycleTheOrdinalQuarter = Rule
{ name = "the <ordinal> quarter"
, pattern =
[ regex "the"
, dimension Ordinal
, Predicate $ isGrain TG.Quarter
]
, prod = \tokens -> case tokens of
(_:token:_) -> do
n <- getIntValue token
tt . cycleNthAfter True TG.Quarter (n - 1) $
cycleNth TG.Year 0
_ -> Nothing
}
ruleCycleOrdinalQuarterYear :: Rule
ruleCycleOrdinalQuarterYear = Rule
{ name = "<ordinal> quarter <year>"
, pattern =
[ dimension Ordinal
, Predicate $ isGrain TG.Quarter
, dimension Time
]
, prod = \tokens -> case tokens of
(token:_:Token Time td:_) -> do
n <- getIntValue token
tt $ cycleNthAfter False TG.Quarter (n - 1) td
_ -> Nothing
}
ruleDurationInWithinAfter :: Rule
ruleDurationInWithinAfter = Rule
{ name = "in|within|after <duration>"
, pattern =
[ regex "(in|within|after)"
, dimension Duration
]
, prod = \tokens -> case tokens of
(Token RegexMatch (GroupMatch (match:_)):
Token Duration dd:
_) -> case Text.toLower match of
"within" -> Token Time <$>
interval TTime.Open (cycleNth TG.Second 0) (inDuration dd)
"after" -> tt . withDirection TTime.After $ inDuration dd
"in" -> tt $ inDuration dd
_ -> Nothing
_ -> Nothing
}
ruleDurationLastNext :: Rule
ruleDurationLastNext = Rule
{ name = "last|past|next <duration>"
, pattern =
[ regex "([lp]ast|next)"
, dimension Duration
]
, prod = \tokens -> case tokens of
(Token RegexMatch (GroupMatch (match:_)):
Token Duration DurationData{TDuration.grain, TDuration.value}:
_) -> case Text.toLower match of
"next" -> tt $ cycleN True grain value
"last" -> tt $ cycleN True grain (- value)
"past" -> tt $ cycleN True grain (- value)
_ -> Nothing
_ -> Nothing
}
ruleDurationHenceAgo :: Rule
ruleDurationHenceAgo = Rule
{ name = "<duration> hence|ago"
, pattern =
[ dimension Duration
, regex "(hence|ago)"
]
, prod = \tokens -> case tokens of
(Token Duration dd:
Token RegexMatch (GroupMatch (match:_)):
_) -> case Text.toLower match of
"ago" -> tt $ durationAgo dd
_ -> tt $ inDuration dd
_ -> Nothing
}
ruleInNumeral :: Rule
ruleInNumeral = Rule
{ name = "in <number> (implicit minutes)"
, pattern =
[ regex "in"
, Predicate $ isIntegerBetween 0 60
]
, prod = \tokens -> case tokens of
(_:Token Numeral NumeralData{TNumeral.value = v}:_) ->
tt . inDuration . duration TG.Minute $ floor v
_ -> Nothing
}
ruleDurationAfterBeforeTime :: Rule
ruleDurationAfterBeforeTime = Rule
{ name = "<duration> after|before|from <time>"
, pattern =
[ dimension Duration
, regex "(after|before|from)"
, dimension Time
]
, prod = \tokens -> case tokens of
(Token Duration dd:
Token RegexMatch (GroupMatch (match:_)):
Token Time td:
_) -> case Text.toLower match of
"before" -> tt $ durationBefore dd td
_ -> tt $ durationAfter dd td
_ -> Nothing
}
ruleIntervalForDurationFrom :: Rule
ruleIntervalForDurationFrom = Rule
{ name = "for <duration> from <time>"
, pattern =
[ regex "for"
, dimension Duration
, regex "(from|starting|beginning|after|starting from)"
, dimension Time
]
, prod = \tokens -> case tokens of
(_:Token Duration dd:_:Token Time td1:_) ->
Token Time <$> interval TTime.Open td1 (durationAfter dd td1)
_ -> Nothing
}
ruleTimezone :: Rule
ruleTimezone = Rule
{ name = "<time> timezone"
, pattern =
[ Predicate $ and . sequence [isNotLatent, isATimeOfDay]
, regex "\\b(YEKT|YEKST|YAKT|YAKST|WITA|WIT|WIB|WGT|WGST|WFT|WET|WEST|WAT|WAST|VUT|VLAT|VLAST|VET|UZT|UYT|UYST|UTC|ULAT|TVT|TMT|TLT|TKT|TJT|TFT|TAHT|SST|SRT|SGT|SCT|SBT|SAST|SAMT|RET|PYT|PYST|PWT|PST|PONT|PMST|PMDT|PKT|PHT|PHOT|PGT|PETT|PETST|PET|PDT|OMST|OMSST|NZST|NZDT|NUT|NST|NPT|NOVT|NOVST|NFT|NDT|NCT|MYT|MVT|MUT|MST|MSK|MSD|MMT|MHT|MDT|MAWT|MART|MAGT|MAGST|LINT|LHST|LHDT|KUYT|KST|KRAT|KRAST|KGT|JST|IST|IRST|IRKT|IRKST|IRDT|IOT|IDT|ICT|HOVT|HKT|GYT|GST|GMT|GILT|GFT|GET|GAMT|GALT|FNT|FKT|FKST|FJT|FJST|EST|EGT|EGST|EET|EEST|EDT|ECT|EAT|EAST|EASST|DAVT|ChST|CXT|CVT|CST|COT|CLT|CLST|CKT|CHAST|CHADT|CET|CEST|CDT|CCT|CAT|CAST|BTT|BST|BRT|BRST|BOT|BNT|AZT|AZST|AZOT|AZOST|AWST|AWDT|AST|ART|AQTT|ANAT|ANAST|AMT|AMST|ALMT|AKST|AKDT|AFT|AEST|AEDT|ADT|ACST|ACDT)\\b"
]
, prod = \tokens -> case tokens of
(Token Time td:
Token RegexMatch (GroupMatch (tz:_)):
_) -> Token Time <$> inTimezone (Text.toUpper tz) td
_ -> Nothing
}
rules :: [Rule]
rules =
[ ruleIntersect
, ruleIntersectOf
, ruleAbsorbOnTime
, ruleAbsorbOnADOW
, ruleAbsorbInMonth
, ruleAbsorbCommaTOD
, ruleNextDOW
, ruleNextTime
, ruleThisTime
, ruleLastTime
, ruleTimeBeforeLastAfterNext
, ruleLastDOWOfTime
, ruleLastCycleOfTime
, ruleLastWeekendOfMonth
, ruleNthTimeOfTime
, ruleTheNthTimeOfTime
, ruleNthTimeAfterTime
, ruleTheNthTimeAfterTime
, ruleYear
, ruleYearPastLatent
, ruleYearFutureLatent
, ruleTheDOMNumeral
, ruleTheDOMOrdinal
, ruleDOMLatent
, ruleNamedDOMOrdinal
, ruleMonthDOMNumeral
, ruleDOMMonth
, ruleDOMOfMonth
, ruleDOMOrdinalMonthYear
, ruleIdesOfMonth
, ruleTODLatent
, ruleAtTOD
, ruleTODOClock
, ruleHHMM
, ruleHHMMLatent
, ruleHHMMSS
, ruleMilitaryAMPM
, ruleMilitarySpelledOutAMPM
, ruleMilitarySpelledOutAMPM2
, ruleTODAMPM
, ruleHONumeral
, ruleHODHalf
, ruleHODQuarter
, ruleNumeralToHOD
, ruleHalfToHOD
, ruleQuarterToHOD
, ruleNumeralAfterHOD
, ruleHalfAfterHOD
, ruleQuarterAfterHOD
, ruleHalfHOD
, ruleYYYYMMDD
, ruleMMYYYY
, ruleNoonMidnightEOD
, rulePartOfDays
, ruleEarlyMorning
, rulePODIn
, rulePODThis
, ruleTonight
, ruleAfterPartofday
, ruleTimePOD
, rulePODofTime
, ruleWeekend
, ruleTODPrecision
, rulePrecisionTOD
, ruleIntervalFromMonthDDDD
, ruleIntervalFromDDDDMonth
, ruleIntervalMonthDDDD
, ruleIntervalDDDDMonth
, ruleIntervalDash
, ruleIntervalFrom
, ruleIntervalBetween
, ruleIntervalTODDash
, ruleIntervalTODFrom
, ruleIntervalTODAMPM
, ruleIntervalTODBetween
, ruleIntervalBy
, ruleIntervalByTheEndOf
, ruleIntervalUntilTOD
, ruleIntervalAfterFromSinceTOD
, ruleCycleTheAfterBeforeTime
, ruleCycleThisLastNext
, ruleCycleAfterBeforeTime
, ruleCycleOrdinalOfTime
, ruleCycleTheOrdinalOfTime
, ruleCycleTheOfTime
, ruleCycleOrdinalAfterTime
, ruleCycleTheOrdinalAfterTime
, ruleCycleOrdinalQuarter
, ruleCycleTheOrdinalQuarter
, ruleCycleOrdinalQuarterYear
, ruleDurationInWithinAfter
, ruleDurationLastNext
, ruleDurationHenceAgo
, ruleDurationAfterBeforeTime
, ruleIntervalForDurationFrom
, ruleInNumeral
, ruleTimezone
, rulePartOfMonth
, ruleNow
]
++ ruleInstants
++ ruleDaysOfWeek
++ ruleMonths
++ ruleSeasons
++ ruleUSHolidays