canadian-income-tax-2024.0: Canadian income tax calculation
Safe HaskellNone
LanguageHaskell2010

Tax.Canada.Province.BC

Documentation

data Returns (line :: Type -> Type) Source #

Constructors

Returns 

Fields

Instances

Instances details
(Transformation t, Codomain t ~ (Const m :: Type -> Type), Monoid m, Foldable t Forms, Foldable t BC428, Foldable t BC479) => Foldable t Returns Source # 
Instance details

Defined in Tax.Canada.Province.BC

Methods

foldMap :: (Codomain t ~ (Const m0 :: Type -> Type), Monoid m0) => t -> Returns (Domain t) -> m0

(Transformation t, Functor t Forms, Functor t BC428, Functor t BC479) => Functor t Returns Source # 
Instance details

Defined in Tax.Canada.Province.BC

Methods

(<$>) :: t -> Returns (Domain t) -> Returns (Codomain t)

(Transformation t, Codomain t ~ Compose m f, Applicative m, Traversable t Forms, Traversable t BC428, Traversable t BC479) => Traversable t Returns Source # 
Instance details

Defined in Tax.Canada.Province.BC

Methods

traverse :: forall m0 (f0 :: Type -> Type). Codomain t ~ Compose m0 f0 => t -> Returns (Domain t) -> m0 (Returns f0)

Applicative Returns Source # 
Instance details

Defined in Tax.Canada.Province.BC

Methods

pure :: (forall a. f a) -> Returns f

Apply Returns Source # 
Instance details

Defined in Tax.Canada.Province.BC

Methods

(<*>) :: forall (p :: Type -> Type) (q :: Type -> Type). Returns (p ~> q) -> Returns p -> Returns q

liftA2 :: (forall a. p a -> q a -> r a) -> Returns p -> Returns q -> Returns r

liftA3 :: (forall a. p a -> q a -> r a -> s a) -> Returns p -> Returns q -> Returns r -> Returns s

Foldable Returns Source # 
Instance details

Defined in Tax.Canada.Province.BC

Methods

foldMap :: Monoid m => (forall a. p a -> m) -> Returns p -> m

Functor Returns Source # 
Instance details

Defined in Tax.Canada.Province.BC

Methods

(<$>) :: (forall a. p a -> q a) -> Returns p -> Returns q

Traversable Returns Source # 
Instance details

Defined in Tax.Canada.Province.BC

Methods

traverse :: Applicative m => (forall a. p a -> m (q a)) -> Returns p -> m (Returns q)

sequence :: forall m (p :: Type -> Type). Applicative m => Returns (Compose m p) -> m (Returns p)

(Show (Forms line), Show (BC428 line), Show (BC479 line)) => Show (Returns line) Source # 
Instance details

Defined in Tax.Canada.Province.BC

Methods

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

show :: Returns line -> String #

showList :: [Returns line] -> ShowS #

(Eq (Forms line), Eq (BC428 line), Eq (BC479 line)) => Eq (Returns line) Source # 
Instance details

Defined in Tax.Canada.Province.BC

Methods

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

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

data BC428 (line :: Type -> Type) Source #

Instances

Instances details
(Transformation t, Codomain t ~ (Const m :: Type -> Type), Monoid m, Foldable t Page1, Foldable t Page2, Foldable t Page3) => Foldable t BC428 Source # 
Instance details

Defined in Tax.Canada.Province.BC.BC428.Types

Methods

foldMap :: (Codomain t ~ (Const m0 :: Type -> Type), Monoid m0) => t -> BC428 (Domain t) -> m0

(Transformation t, Functor t Page1, Functor t Page2, Functor t Page3) => Functor t BC428 Source # 
Instance details

Defined in Tax.Canada.Province.BC.BC428.Types

Methods

(<$>) :: t -> BC428 (Domain t) -> BC428 (Codomain t)

(Transformation t, Codomain t ~ Compose m f, Applicative m, Traversable t Page1, Traversable t Page2, Traversable t Page3) => Traversable t BC428 Source # 
Instance details

Defined in Tax.Canada.Province.BC.BC428.Types

Methods

traverse :: forall m0 (f0 :: Type -> Type). Codomain t ~ Compose m0 f0 => t -> BC428 (Domain t) -> m0 (BC428 f0)

Applicative BC428 Source # 
Instance details

Defined in Tax.Canada.Province.BC.BC428.Types

Methods

pure :: (forall a. f a) -> BC428 f

Apply BC428 Source # 
Instance details

Defined in Tax.Canada.Province.BC.BC428.Types

Methods

(<*>) :: forall (p :: Type -> Type) (q :: Type -> Type). BC428 (p ~> q) -> BC428 p -> BC428 q

liftA2 :: (forall a. p a -> q a -> r a) -> BC428 p -> BC428 q -> BC428 r

liftA3 :: (forall a. p a -> q a -> r a -> s a) -> BC428 p -> BC428 q -> BC428 r -> BC428 s

Distributive BC428 Source # 
Instance details

Defined in Tax.Canada.Province.BC.BC428.Types

Methods

collect :: forall p a (q :: Type -> Type). Functor p => (a -> BC428 q) -> p a -> BC428 (Compose p q)

distribute :: forall p (q :: Type -> Type). Functor p => p (BC428 q) -> BC428 (Compose p q)

cotraverse :: Functor m => (forall a. m (p a) -> q a) -> m (BC428 p) -> BC428 q

DistributiveTraversable BC428 Source # 
Instance details

Defined in Tax.Canada.Province.BC.BC428.Types

Methods

collectTraversable :: forall f1 a (f2 :: Type -> Type). Traversable f1 => (a -> BC428 f2) -> f1 a -> BC428 (Compose f1 f2)

distributeTraversable :: forall f1 (f2 :: Type -> Type). Traversable f1 => f1 (BC428 f2) -> BC428 (Compose f1 f2)

cotraverseTraversable :: Traversable f1 => (forall x. f1 (f2 x) -> f x) -> f1 (BC428 f2) -> BC428 f

Foldable BC428 Source # 
Instance details

Defined in Tax.Canada.Province.BC.BC428.Types

Methods

foldMap :: Monoid m => (forall a. p a -> m) -> BC428 p -> m

Functor BC428 Source # 
Instance details

Defined in Tax.Canada.Province.BC.BC428.Types

Methods

(<$>) :: (forall a. p a -> q a) -> BC428 p -> BC428 q

Logistic BC428 Source # 
Instance details

Defined in Tax.Canada.Province.BC.BC428.Types

Methods

deliver :: forall p (q :: Type -> Type). Contravariant p => p (BC428 q -> BC428 q) -> BC428 (Compose p (q ~> q))

Traversable BC428 Source # 
Instance details

Defined in Tax.Canada.Province.BC.BC428.Types

Methods

traverse :: Applicative m => (forall a. p a -> m (q a)) -> BC428 p -> m (BC428 q)

sequence :: forall m (p :: Type -> Type). Applicative m => BC428 (Compose m p) -> m (BC428 p)

(Show (line Centi), Show (line Rational), Show (line Text), Show (line Word)) => Show (BC428 line) Source # 
Instance details

Defined in Tax.Canada.Province.BC.BC428.Types

Methods

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

show :: BC428 line -> String #

showList :: [BC428 line] -> ShowS #

(Eq (line Centi), Eq (line Rational), Eq (line Text), Eq (line Word)) => Eq (BC428 line) Source # 
Instance details

Defined in Tax.Canada.Province.BC.BC428.Types

Methods

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

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

fixBC479 :: BC479 Maybe -> BC479 Maybe Source #