-- https://developer.paddle.com/webhook-reference/subscription-alerts/subscription-cancelled
module Paddle.WebHook.SubscriptionCancelled where

import Protolude
import Prelude ()

data SubscriptionCancelled passthrough = SubscriptionCancelled
  { SubscriptionCancelled passthrough -> Text
subscriptionId :: Text
  , SubscriptionCancelled passthrough -> Text
subscriptionPlanId :: Text
  , SubscriptionCancelled passthrough -> Text
cancellationEffectiveDate :: Text
  , SubscriptionCancelled passthrough -> passthrough
passthrough :: passthrough
  } deriving ((forall x.
 SubscriptionCancelled passthrough
 -> Rep (SubscriptionCancelled passthrough) x)
-> (forall x.
    Rep (SubscriptionCancelled passthrough) x
    -> SubscriptionCancelled passthrough)
-> Generic (SubscriptionCancelled passthrough)
forall x.
Rep (SubscriptionCancelled passthrough) x
-> SubscriptionCancelled passthrough
forall x.
SubscriptionCancelled passthrough
-> Rep (SubscriptionCancelled passthrough) x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
forall passthrough x.
Rep (SubscriptionCancelled passthrough) x
-> SubscriptionCancelled passthrough
forall passthrough x.
SubscriptionCancelled passthrough
-> Rep (SubscriptionCancelled passthrough) x
$cto :: forall passthrough x.
Rep (SubscriptionCancelled passthrough) x
-> SubscriptionCancelled passthrough
$cfrom :: forall passthrough x.
SubscriptionCancelled passthrough
-> Rep (SubscriptionCancelled passthrough) x
Generic, Int -> SubscriptionCancelled passthrough -> ShowS
[SubscriptionCancelled passthrough] -> ShowS
SubscriptionCancelled passthrough -> String
(Int -> SubscriptionCancelled passthrough -> ShowS)
-> (SubscriptionCancelled passthrough -> String)
-> ([SubscriptionCancelled passthrough] -> ShowS)
-> Show (SubscriptionCancelled passthrough)
forall passthrough.
Show passthrough =>
Int -> SubscriptionCancelled passthrough -> ShowS
forall passthrough.
Show passthrough =>
[SubscriptionCancelled passthrough] -> ShowS
forall passthrough.
Show passthrough =>
SubscriptionCancelled passthrough -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [SubscriptionCancelled passthrough] -> ShowS
$cshowList :: forall passthrough.
Show passthrough =>
[SubscriptionCancelled passthrough] -> ShowS
show :: SubscriptionCancelled passthrough -> String
$cshow :: forall passthrough.
Show passthrough =>
SubscriptionCancelled passthrough -> String
showsPrec :: Int -> SubscriptionCancelled passthrough -> ShowS
$cshowsPrec :: forall passthrough.
Show passthrough =>
Int -> SubscriptionCancelled passthrough -> ShowS
Show)