thyme-0.3.5.5: A faster time library

Safe HaskellNone
LanguageHaskell2010

Data.Thyme.Calendar.WeekDate

Contents

Description

Various Week Date formats

Synopsis

Documentation

type Year = Int #

type DayOfWeek = Int #

ISO 8601 Week Date

data WeekDate #

Weeks numbered 01 to 53, where week 01 is the first week that has at least 4 days in the new year. Days before week 01 are considered to belong to the previous year.

Constructors

WeekDate 

Fields

Instances

Eq WeekDate # 
Data WeekDate # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> WeekDate -> c WeekDate #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c WeekDate #

toConstr :: WeekDate -> Constr #

dataTypeOf :: WeekDate -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c WeekDate) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c WeekDate) #

gmapT :: (forall b. Data b => b -> b) -> WeekDate -> WeekDate #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> WeekDate -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> WeekDate -> r #

gmapQ :: (forall d. Data d => d -> u) -> WeekDate -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> WeekDate -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> WeekDate -> m WeekDate #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> WeekDate -> m WeekDate #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> WeekDate -> m WeekDate #

Ord WeekDate # 
Show WeekDate # 
Generic WeekDate # 

Associated Types

type Rep WeekDate :: * -> * #

Methods

from :: WeekDate -> Rep WeekDate x #

to :: Rep WeekDate x -> WeekDate #

NFData WeekDate # 

Methods

rnf :: WeekDate -> () #

Unbox WeekDate # 
ParseTime WeekDate # 
FormatTime WeekDate # 

Methods

showsTime :: TimeLocale -> WeekDate -> (Char -> ShowS) -> Char -> ShowS #

Vector Vector WeekDate # 
MVector MVector WeekDate # 
type Rep WeekDate # 
type Rep WeekDate = D1 (MetaData "WeekDate" "Data.Thyme.Calendar.Internal" "thyme-0.3.5.5-Euo2CSV7iPYDvUTkZvcOvB" False) (C1 (MetaCons "WeekDate" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "wdYear") SourceUnpack SourceStrict DecidedUnpack) (Rec0 Year)) ((:*:) (S1 (MetaSel (Just Symbol "wdWeek") SourceUnpack SourceStrict DecidedUnpack) (Rec0 WeekOfYear)) (S1 (MetaSel (Just Symbol "wdDay") SourceUnpack SourceStrict DecidedUnpack) (Rec0 DayOfWeek)))))
data Vector WeekDate # 
data MVector s WeekDate # 

Weeks starting Sunday

data SundayWeek #

Weeks numbered from 0 to 53, starting with the first Sunday of the year as the first day of week 1. The last week of a given year and week 0 of the next both refer to the same week, but not all DayOfWeek are valid. Year coincides with that of gregorian.

Constructors

SundayWeek 

Fields

Instances

Eq SundayWeek # 
Data SundayWeek # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SundayWeek -> c SundayWeek #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SundayWeek #

toConstr :: SundayWeek -> Constr #

dataTypeOf :: SundayWeek -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c SundayWeek) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SundayWeek) #

gmapT :: (forall b. Data b => b -> b) -> SundayWeek -> SundayWeek #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SundayWeek -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SundayWeek -> r #

gmapQ :: (forall d. Data d => d -> u) -> SundayWeek -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SundayWeek -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SundayWeek -> m SundayWeek #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SundayWeek -> m SundayWeek #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SundayWeek -> m SundayWeek #

Ord SundayWeek # 
Show SundayWeek # 
Generic SundayWeek # 

Associated Types

type Rep SundayWeek :: * -> * #

NFData SundayWeek # 

Methods

rnf :: SundayWeek -> () #

Unbox SundayWeek # 
ParseTime SundayWeek # 
FormatTime SundayWeek # 

Methods

showsTime :: TimeLocale -> SundayWeek -> (Char -> ShowS) -> Char -> ShowS #

Vector Vector SundayWeek # 
MVector MVector SundayWeek # 
type Rep SundayWeek # 
type Rep SundayWeek = D1 (MetaData "SundayWeek" "Data.Thyme.Calendar.Internal" "thyme-0.3.5.5-Euo2CSV7iPYDvUTkZvcOvB" False) (C1 (MetaCons "SundayWeek" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "swYear") SourceUnpack SourceStrict DecidedUnpack) (Rec0 Year)) ((:*:) (S1 (MetaSel (Just Symbol "swWeek") SourceUnpack SourceStrict DecidedUnpack) (Rec0 WeekOfYear)) (S1 (MetaSel (Just Symbol "swDay") SourceUnpack SourceStrict DecidedUnpack) (Rec0 DayOfWeek)))))
data Vector SundayWeek # 
data MVector s SundayWeek # 

Weeks starting Monday

data MondayWeek #

Weeks numbered from 0 to 53, starting with the first Monday of the year as the first day of week 1. The last week of a given year and week 0 of the next both refer to the same week, but not all DayOfWeek are valid. Year coincides with that of gregorian.

Constructors

MondayWeek 

Fields

Instances

Eq MondayWeek # 
Data MondayWeek # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> MondayWeek -> c MondayWeek #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c MondayWeek #

toConstr :: MondayWeek -> Constr #

dataTypeOf :: MondayWeek -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c MondayWeek) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c MondayWeek) #

gmapT :: (forall b. Data b => b -> b) -> MondayWeek -> MondayWeek #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> MondayWeek -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> MondayWeek -> r #

gmapQ :: (forall d. Data d => d -> u) -> MondayWeek -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> MondayWeek -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> MondayWeek -> m MondayWeek #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> MondayWeek -> m MondayWeek #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> MondayWeek -> m MondayWeek #

Ord MondayWeek # 
Show MondayWeek # 
Generic MondayWeek # 

Associated Types

type Rep MondayWeek :: * -> * #

NFData MondayWeek # 

Methods

rnf :: MondayWeek -> () #

Unbox MondayWeek # 
ParseTime MondayWeek # 
FormatTime MondayWeek # 

Methods

showsTime :: TimeLocale -> MondayWeek -> (Char -> ShowS) -> Char -> ShowS #

Vector Vector MondayWeek # 
MVector MVector MondayWeek # 
type Rep MondayWeek # 
type Rep MondayWeek = D1 (MetaData "MondayWeek" "Data.Thyme.Calendar.Internal" "thyme-0.3.5.5-Euo2CSV7iPYDvUTkZvcOvB" False) (C1 (MetaCons "MondayWeek" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "mwYear") SourceUnpack SourceStrict DecidedUnpack) (Rec0 Year)) ((:*:) (S1 (MetaSel (Just Symbol "mwWeek") SourceUnpack SourceStrict DecidedUnpack) (Rec0 WeekOfYear)) (S1 (MetaSel (Just Symbol "mwDay") SourceUnpack SourceStrict DecidedUnpack) (Rec0 DayOfWeek)))))
data Vector MondayWeek # 
data MVector s MondayWeek # 

Lenses

Orphan instances

Bounded MondayWeek # 
Bounded SundayWeek # 
Bounded WeekDate # 
Arbitrary MondayWeek # 
Arbitrary SundayWeek # 
Arbitrary WeekDate # 
CoArbitrary MondayWeek # 

Methods

coarbitrary :: MondayWeek -> Gen b -> Gen b #

CoArbitrary SundayWeek # 

Methods

coarbitrary :: SundayWeek -> Gen b -> Gen b #

CoArbitrary WeekDate # 

Methods

coarbitrary :: WeekDate -> Gen b -> Gen b #

Random MondayWeek # 
Random SundayWeek # 
Random WeekDate #