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

Tax.Canada.Federal.Schedule7

Documentation

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

Constructors

Schedule7 

Fields

Instances

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

Defined in Tax.Canada.Federal.Schedule7

Methods

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

(Transformation t, Functor t Page2, Functor t Page3, Functor t Page4) => Functor t Schedule7 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule7

Methods

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

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

Defined in Tax.Canada.Federal.Schedule7

Methods

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

Applicative Schedule7 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule7

Methods

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

Apply Schedule7 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule7

Methods

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

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

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

Distributive Schedule7 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule7

Methods

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

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

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

DistributiveTraversable Schedule7 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule7

Methods

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

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

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

Foldable Schedule7 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule7

Methods

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

Functor Schedule7 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule7

Methods

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

Logistic Schedule7 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule7

Methods

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

Traversable Schedule7 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule7

Methods

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

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

(Show (line Bool), Show (line Centi), Show (line Rational)) => Show (Schedule7 line) Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule7

Methods

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

show :: Schedule7 line -> String #

showList :: [Schedule7 line] -> ShowS #

(Eq (line Bool), Eq (line Centi), Eq (line Rational)) => Eq (Schedule7 line) Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule7

Methods

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

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

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

Instances

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

Defined in Tax.Canada.Federal.Schedule7

Methods

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

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

Defined in Tax.Canada.Federal.Schedule7

Methods

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

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

Defined in Tax.Canada.Federal.Schedule7

Methods

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

Applicative Page2 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule7

Methods

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

Apply Page2 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule7

Methods

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

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

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

Distributive Page2 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule7

Methods

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

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

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

DistributiveTraversable Page2 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule7

Methods

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

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

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

Foldable Page2 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule7

Methods

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

Functor Page2 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule7

Methods

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

Logistic Page2 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule7

Methods

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

Traversable Page2 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule7

Methods

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

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

(Show (line Bool), Show (line Centi), Show (line Rational)) => Show (Page2 line) Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule7

Methods

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

show :: Page2 line -> String #

showList :: [Page2 line] -> ShowS #

(Eq (line Bool), Eq (line Centi), Eq (line Rational)) => Eq (Page2 line) Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule7

Methods

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

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

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

Constructors

Page3 

Fields

Instances

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

Defined in Tax.Canada.Federal.Schedule7

Methods

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

(Transformation t, Functor t PartB, Functor t PartC) => Functor t Page3 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule7

Methods

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

(Transformation t, Codomain t ~ Compose m f, Applicative m, Traversable t PartB, Traversable t PartC) => Traversable t Page3 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule7

Methods

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

Applicative Page3 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule7

Methods

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

Apply Page3 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule7

Methods

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

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

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

Distributive Page3 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule7

Methods

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

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

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

DistributiveTraversable Page3 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule7

Methods

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

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

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

Foldable Page3 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule7

Methods

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

Functor Page3 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule7

Methods

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

Logistic Page3 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule7

Methods

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

Traversable Page3 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule7

Methods

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

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

(Show (line Bool), Show (line Centi), Show (line Rational)) => Show (Page3 line) Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule7

Methods

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

show :: Page3 line -> String #

showList :: [Page3 line] -> ShowS #

(Eq (line Bool), Eq (line Centi), Eq (line Rational)) => Eq (Page3 line) Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule7

Methods

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

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

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

Instances

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

Defined in Tax.Canada.Federal.Schedule7

Methods

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

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

Defined in Tax.Canada.Federal.Schedule7

Methods

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

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

Defined in Tax.Canada.Federal.Schedule7

Methods

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

Applicative PartB Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule7

Methods

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

Apply PartB Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule7

Methods

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

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

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

Distributive PartB Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule7

Methods

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

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

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

DistributiveTraversable PartB Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule7

Methods

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

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

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

Foldable PartB Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule7

Methods

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

Functor PartB Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule7

Methods

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

Logistic PartB Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule7

Methods

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

Traversable PartB Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule7

Methods

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

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

(Show (line Bool), Show (line Centi), Show (line Rational)) => Show (PartB line) Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule7

Methods

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

show :: PartB line -> String #

showList :: [PartB line] -> ShowS #

(Eq (line Bool), Eq (line Centi), Eq (line Rational)) => Eq (PartB line) Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule7

Methods

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

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

data PartC (line :: Type -> Type) 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) => Foldable t PartC Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule7

Methods

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

(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) => Functor t PartC Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule7

Methods

(<$>) :: t -> PartC (Domain t) -> PartC (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) => Traversable t PartC Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule7

Methods

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

Applicative PartC Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule7

Methods

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

Apply PartC Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule7

Methods

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

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

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

Distributive PartC Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule7

Methods

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

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

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

DistributiveTraversable PartC Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule7

Methods

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

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

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

Foldable PartC Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule7

Methods

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

Functor PartC Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule7

Methods

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

Logistic PartC Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule7

Methods

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

Traversable PartC Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule7

Methods

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

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

(Show (line Bool), Show (line Centi), Show (line Rational)) => Show (PartC line) Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule7

Methods

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

show :: PartC line -> String #

showList :: [PartC line] -> ShowS #

(Eq (line Bool), Eq (line Centi), Eq (line Rational)) => Eq (PartC line) Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule7

Methods

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

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

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

Constructors

Page4 

Fields

Instances

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

Defined in Tax.Canada.Federal.Schedule7

Methods

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

(Transformation t, Functor t PartD, Functor t PartE, At t Centi) => Functor t Page4 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule7

Methods

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

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

Defined in Tax.Canada.Federal.Schedule7

Methods

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

Applicative Page4 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule7

Methods

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

Apply Page4 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule7

Methods

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

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

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

Distributive Page4 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule7

Methods

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

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

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

DistributiveTraversable Page4 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule7

Methods

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

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

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

Foldable Page4 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule7

Methods

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

Functor Page4 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule7

Methods

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

Logistic Page4 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule7

Methods

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

Traversable Page4 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule7

Methods

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

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

(Show (line Bool), Show (line Centi), Show (line Rational)) => Show (Page4 line) Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule7

Methods

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

show :: Page4 line -> String #

showList :: [Page4 line] -> ShowS #

(Eq (line Bool), Eq (line Centi), Eq (line Rational)) => Eq (Page4 line) Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule7

Methods

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

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

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

Constructors

PartD 

Fields

Instances

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

Defined in Tax.Canada.Federal.Schedule7

Methods

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

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

Defined in Tax.Canada.Federal.Schedule7

Methods

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

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

Defined in Tax.Canada.Federal.Schedule7

Methods

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

Applicative PartD Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule7

Methods

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

Apply PartD Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule7

Methods

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

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

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

Distributive PartD Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule7

Methods

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

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

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

DistributiveTraversable PartD Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule7

Methods

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

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

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

Foldable PartD Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule7

Methods

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

Functor PartD Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule7

Methods

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

Logistic PartD Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule7

Methods

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

Traversable PartD Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule7

Methods

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

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

(Show (line Bool), Show (line Centi), Show (line Rational)) => Show (PartD line) Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule7

Methods

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

show :: PartD line -> String #

showList :: [PartD line] -> ShowS #

(Eq (line Bool), Eq (line Centi), Eq (line Rational)) => Eq (PartD line) Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule7

Methods

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

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

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

Constructors

PartE 

Instances

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

Defined in Tax.Canada.Federal.Schedule7

Methods

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

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

Defined in Tax.Canada.Federal.Schedule7

Methods

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

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

Defined in Tax.Canada.Federal.Schedule7

Methods

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

Applicative PartE Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule7

Methods

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

Apply PartE Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule7

Methods

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

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

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

Distributive PartE Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule7

Methods

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

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

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

DistributiveTraversable PartE Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule7

Methods

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

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

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

Foldable PartE Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule7

Methods

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

Functor PartE Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule7

Methods

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

Logistic PartE Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule7

Methods

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

Traversable PartE Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule7

Methods

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

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

(Show (line Bool), Show (line Centi), Show (line Rational)) => Show (PartE line) Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule7

Methods

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

show :: PartE line -> String #

showList :: [PartE line] -> ShowS #

(Eq (line Bool), Eq (line Centi), Eq (line Rational)) => Eq (PartE line) Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule7

Methods

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

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