module Lucid.Htmx where

import Lucid.Base
import Data.Text (Text)

-- | <https://htmx.org/attributes/hx-boost/>
hxBoost_ :: Text -> Attributes
hxBoost_ :: Text -> Attributes
hxBoost_ = Text -> Text -> Attributes
makeAttributes Text
"data-hx-boost"

-- | <https://htmx.org/attributes/hx-confirm/>
hxConfirm_ :: Text -> Attributes
hxConfirm_ :: Text -> Attributes
hxConfirm_ = Text -> Text -> Attributes
makeAttributes Text
"data-hx-confirm"

-- | <https://htmx.org/attributes/hx-delete/>
hxDelete_ :: Text -> Attributes
hxDelete_ :: Text -> Attributes
hxDelete_ = Text -> Text -> Attributes
makeAttributes Text
"data-hx-delete"

-- | <https://htmx.org/attributes/hx-disable/>
hxDisable_ :: Attributes
hxDisable_ :: Attributes
hxDisable_ = Text -> Text -> Attributes
makeAttributes Text
"data-hx-disable" Text
forall a. Monoid a => a
mempty

-- | <https://htmx.org/attributes/hx-encoding/>
hxEncoding_ :: Text -> Attributes
hxEncoding_ :: Text -> Attributes
hxEncoding_ = Text -> Text -> Attributes
makeAttributes Text
"data-hx-encoding"

-- | <https://htmx.org/attributes/hx-ext/>
hxExt_ :: Text -> Attributes
hxExt_ :: Text -> Attributes
hxExt_ = Text -> Text -> Attributes
makeAttributes Text
"data-hx-ext"

-- | <https://htmx.org/attributes/hx-get/>
hxGet_ :: Text -> Attributes
hxGet_ :: Text -> Attributes
hxGet_ = Text -> Text -> Attributes
makeAttributes Text
"data-hx-get"

-- | <https://htmx.org/attributes/hx-headers/>
hxHeaders_ :: Text -> Attributes
hxHeaders_ :: Text -> Attributes
hxHeaders_ = Text -> Text -> Attributes
makeAttributes Text
"data-hx-headers"

-- | <https://htmx.org/attributes/hx-history-elt/>
hxHistoryElt_ :: Attributes
hxHistoryElt_ :: Attributes
hxHistoryElt_ = Text -> Text -> Attributes
makeAttributes Text
"data-hx-history-elt" Text
forall a. Monoid a => a
mempty

-- | <https://htmx.org/attributes/hx-include/>
hxInclude_ :: Text -> Attributes
hxInclude_ :: Text -> Attributes
hxInclude_ = Text -> Text -> Attributes
makeAttributes Text
"data-hx-include"

-- | <https://htmx.org/attributes/hx-indicator/>
hxIndicator_ :: Text -> Attributes
hxIndicator_ :: Text -> Attributes
hxIndicator_ = Text -> Text -> Attributes
makeAttributes Text
"data-hx-indicator"

-- | <https://htmx.org/attributes/hx-params/>
hxParams_ :: Text -> Attributes
hxParams_ :: Text -> Attributes
hxParams_ = Text -> Text -> Attributes
makeAttributes Text
"data-hx-params"

-- | <https://htmx.org/attributes/hx-patch/>
hxPatch_ :: Text -> Attributes
hxPatch_ :: Text -> Attributes
hxPatch_ = Text -> Text -> Attributes
makeAttributes Text
"data-hx-patch"

-- | <https://htmx.org/attributes/hx-post/>
hxPost_ :: Text -> Attributes
hxPost_ :: Text -> Attributes
hxPost_ = Text -> Text -> Attributes
makeAttributes Text
"data-hx-post"

-- | <https://htmx.org/attributes/hx-preserve/>
hxPreserve_ :: Text -> Attributes
hxPreserve_ :: Text -> Attributes
hxPreserve_ = Text -> Text -> Attributes
makeAttributes Text
"data-hx-preserve"

-- | <https://htmx.org/attributes/hx-prompt/>
hxPrompt_ :: Text -> Attributes
hxPrompt_ :: Text -> Attributes
hxPrompt_ = Text -> Text -> Attributes
makeAttributes Text
"data-hx-prompt"

-- | <https://htmx.org/attributes/hx-push-url/>
hxPushUrl_ :: Text -> Attributes
hxPushUrl_ :: Text -> Attributes
hxPushUrl_ = Text -> Text -> Attributes
makeAttributes Text
"data-hx-push-url"

-- | <https://htmx.org/attributes/hx-put/>
hxPut_ :: Text -> Attributes
hxPut_ :: Text -> Attributes
hxPut_ = Text -> Text -> Attributes
makeAttributes Text
"data-hx-put"

-- | <https://htmx.org/attributes/hx-request/>
hxRequest_ :: Text -> Attributes
hxRequest_ :: Text -> Attributes
hxRequest_ = Text -> Text -> Attributes
makeAttributes Text
"data-hx-request"

-- | <https://htmx.org/attributes/hx-select/>
hxSelect_ :: Text -> Attributes
hxSelect_ :: Text -> Attributes
hxSelect_ = Text -> Text -> Attributes
makeAttributes Text
"data-hx-select"

-- | <https://htmx.org/attributes/hx-sse/>
hxSse_ :: Text -> Attributes
hxSse_ :: Text -> Attributes
hxSse_ = Text -> Text -> Attributes
makeAttributes Text
"data-hx-sse"

-- | <https://htmx.org/attributes/hx-swap-oob/>
hxSwapOob_ :: Text -> Attributes
hxSwapOob_ :: Text -> Attributes
hxSwapOob_ = Text -> Text -> Attributes
makeAttributes Text
"data-hx-swap-oob"

-- | <https://htmx.org/attributes/hx-swap/>
hxSwap_ :: Text -> Attributes
hxSwap_ :: Text -> Attributes
hxSwap_ = Text -> Text -> Attributes
makeAttributes Text
"data-hx-swap"

-- | <https://htmx.org/attributes/hx-target/>
hxTarget_ :: Text -> Attributes
hxTarget_ :: Text -> Attributes
hxTarget_ = Text -> Text -> Attributes
makeAttributes Text
"data-hx-target"

-- | <https://htmx.org/attributes/hx-trigger/>
hxTrigger_ :: Text -> Attributes
hxTrigger_ :: Text -> Attributes
hxTrigger_ = Text -> Text -> Attributes
makeAttributes Text
"data-hx-trigger"

-- | <https://htmx.org/attributes/hx-vals/>
hxVals_ :: Text -> Attributes
hxVals_ :: Text -> Attributes
hxVals_ = Text -> Text -> Attributes
makeAttributes Text
"data-hx-vals"

-- | <https://htmx.org/attributes/hx-ws/>
hxWs_ :: Text -> Attributes
hxWs_ :: Text -> Attributes
hxWs_ = Text -> Text -> Attributes
makeAttributes Text
"data-hx-ws"