{-# LANGUAGE DataKinds #-} {-# LANGUAGE PolyKinds #-} {-# LANGUAGE Safe #-} {-# LANGUAGE TypeOperators #-} -- | -- Module: Data.Time.Format.Typed.Formats -- Copyright: (c) 20021 Gautier DI FOLCO -- License: ISC -- Maintainer: Gautier DI FOLCO -- Stability: experimental -- Portability: GHC -- -- Some standard formats module Data.Time.Format.Typed.Formats ( RFC822, ) where import Data.Time.Format.Typed -- | Format string according to . type RFC822 = 'WeekDayShort :<> ", " :<> SpacesPadding 'DayZeroPadded :<> " " :<> 'MonthShort :<> " " :<> 'Year :<> " " :<> 'PaddedTwentyFourHours :<> ":" :<> 'PaddedMinutes :<> ":" :<> 'PaddedSeconds :<> " " :<> 'TimeZoneName