canadian-income-tax-2023.0: Canadian income tax calculation
Safe HaskellSafe-Inferred
LanguageHaskell2010

Tax.Canada.Federal.Schedule9

Documentation

data Schedule9 line Source #

Instances

Instances details
(Transformation t, Codomain t ~ (Const m :: Type -> Type), Monoid m, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi) => Foldable t Schedule9 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule9

Methods

foldMap :: (Codomain t ~ Const m, Monoid m) => t -> Schedule9 (Domain t) -> m #

(Transformation t, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi) => Functor t Schedule9 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule9

Methods

(<$>) :: t -> Schedule9 (Domain t) -> Schedule9 (Codomain t) #

(Transformation t, Codomain t ~ Compose m f, Applicative m, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi) => Traversable t Schedule9 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule9

Methods

traverse :: forall m (f :: Type -> Type). Codomain t ~ Compose m f => t -> Schedule9 (Domain t) -> m (Schedule9 f) #

Applicative Schedule9 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule9

Methods

pure :: (forall (a :: k). f a) -> Schedule9 f #

Apply Schedule9 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule9

Methods

(<*>) :: forall (p :: k -> Type) (q :: k -> Type). Schedule9 (p ~> q) -> Schedule9 p -> Schedule9 q #

liftA2 :: (forall (a :: k). p a -> q a -> r a) -> Schedule9 p -> Schedule9 q -> Schedule9 r #

liftA3 :: (forall (a :: k). p a -> q a -> r a -> s a) -> Schedule9 p -> Schedule9 q -> Schedule9 r -> Schedule9 s #

Distributive Schedule9 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule9

Methods

collect :: forall p a (q :: k1 -> Type). Functor p => (a -> Schedule9 q) -> p a -> Schedule9 (Compose p q) #

distribute :: forall p (q :: k1 -> Type). Functor p => p (Schedule9 q) -> Schedule9 (Compose p q) #

cotraverse :: Functor m => (forall (a :: k1). m (p a) -> q a) -> m (Schedule9 p) -> Schedule9 q #

DistributiveTraversable Schedule9 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule9

Methods

collectTraversable :: forall f1 a (f2 :: k -> Type). Traversable f1 => (a -> Schedule9 f2) -> f1 a -> Schedule9 (Compose f1 f2) #

distributeTraversable :: forall f1 (f2 :: k -> Type). Traversable f1 => f1 (Schedule9 f2) -> Schedule9 (Compose f1 f2) #

cotraverseTraversable :: Traversable f1 => (forall (x :: k). f1 (f2 x) -> f x) -> f1 (Schedule9 f2) -> Schedule9 f #

Foldable Schedule9 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule9

Methods

foldMap :: Monoid m => (forall (a :: k). p a -> m) -> Schedule9 p -> m #

Functor Schedule9 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule9

Methods

(<$>) :: (forall (a :: k). p a -> q a) -> Schedule9 p -> Schedule9 q #

Logistic Schedule9 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule9

Methods

deliver :: forall p (q :: k1 -> Type). Contravariant p => p (Schedule9 q -> Schedule9 q) -> Schedule9 (Compose p (q ~> q)) #

Traversable Schedule9 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule9

Methods

traverse :: Applicative m => (forall (a :: k). p a -> m (q a)) -> Schedule9 p -> m (Schedule9 q) #

sequence :: forall m (p :: k -> Type). Applicative m => Schedule9 (Compose m p) -> m (Schedule9 p) #

Show (line Centi) => Show (Schedule9 line) Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule9

Methods

showsPrec :: Int -> Schedule9 line -> ShowS #

show :: Schedule9 line -> String #

showList :: [Schedule9 line] -> ShowS #

Eq (line Centi) => Eq (Schedule9 line) Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule9

Methods

(==) :: Schedule9 line -> Schedule9 line -> Bool #

(/=) :: Schedule9 line -> Schedule9 line -> Bool #