{-# LANGUAGE OverloadedStrings #-}
module Contexts.Field.RokiDiary.GAdsense (
    gAdSenseHeader
  , gAdSenseBeforeContentBody
  , gAdSenseFooter
) where

import qualified Data.Text.Lazy as TL
import           Lucid.Base     (Html)
import           Lucid.Html5

gAdSenseBeforeContentBody :: Html ()
gAdSenseBeforeContentBody :: Html ()
gAdSenseBeforeContentBody = do
    [Attribute] -> Text -> Html ()
forall arg result. TermRaw arg result => arg -> result
script_ [
        Text -> Attribute
async_ Text
forall a. Monoid a => a
mempty
      , Text -> Attribute
src_ Text
"https://pagead2.googlesyndication.com/pagead/js/adsbygoogle.js?client=ca-pub-5658861742931397"
      , Text -> Attribute
crossorigin_ Text
"anonymous"
      ]
        Text
TL.empty
    [Attribute] -> Html () -> Html ()
forall arg result. Term arg result => arg -> result
ins_ [
        Text -> Attribute
class_ Text
"adsbygoogle"
      , Text -> Attribute
forall arg result. TermRaw arg result => arg -> result
style_ Text
"display:block"
      , Text -> Text -> Attribute
data_ Text
"ad-client" Text
"ca-pub-5658861742931397"
      , Text -> Text -> Attribute
data_ Text
"ad-slot" Text
"9593271026"
      , Text -> Text -> Attribute
data_ Text
"ad-format" Text
"auto"
      , Text -> Text -> Attribute
data_ Text
"full-width-responsive" Text
"true"
      ]
        Html ()
forall a. Monoid a => a
mempty
    Text -> Html ()
forall arg result. TermRaw arg result => arg -> result
script_ Text
"(adsbygoogle = window.adsbygoogle || []).push({});"

gAdSenseFooter :: Html ()
gAdSenseFooter :: Html ()
gAdSenseFooter = do
    [Attribute] -> Text -> Html ()
forall arg result. TermRaw arg result => arg -> result
script_ [
        Text -> Attribute
async_ Text
forall a. Monoid a => a
mempty
      , Text -> Attribute
src_ Text
"https://pagead2.googlesyndication.com/pagead/js/adsbygoogle.js?client=ca-pub-5658861742931397"
      , Text -> Attribute
crossorigin_ Text
"anonymous"
      ]
        Text
TL.empty
    [Attribute] -> Html () -> Html ()
forall arg result. Term arg result => arg -> result
ins_ [
        Text -> Attribute
class_ Text
"adsbygoogle"
      , Text -> Attribute
forall arg result. TermRaw arg result => arg -> result
style_ Text
"display:block"
      , Text -> Text -> Attribute
data_ Text
"ad-format" Text
"autorelaxed"
      , Text -> Text -> Attribute
data_ Text
"ad-client" Text
"ca-pub-5658861742931397"
      , Text -> Text -> Attribute
data_ Text
"ad-slot" Text
"1547222058"
      ]
        Html ()
forall a. Monoid a => a
mempty
    Text -> Html ()
forall arg result. TermRaw arg result => arg -> result
script_ Text
"(adsbygoogle = window.adsbygoogle || []).push({});"

gAdSenseHeader :: Html ()
gAdSenseHeader :: Html ()
gAdSenseHeader = [Attribute] -> Text -> Html ()
forall arg result. TermRaw arg result => arg -> result
script_ [
    Text -> Text -> Attribute
data_ Text
"ad-client" Text
"ca-pub-5658861742931397"
  , Text -> Attribute
async_ Text
forall a. Monoid a => a
mempty
  , Text -> Attribute
src_ Text
"https://pagead2.googlesyndication.com/pagead/js/adsbygoogle.js"
  ]
    Text
TL.empty