{-# LANGUAGE OverloadedStrings #-}
module Text.Blaze.Htmx.WebSockets where

import Text.Blaze.Internal (attribute, Attribute, AttributeValue)

wsConnect :: AttributeValue -> Attribute
wsConnect :: AttributeValue -> Attribute
wsConnect = Tag -> Tag -> AttributeValue -> Attribute
attribute "ws-connect" " ws-connect=\""
{-# INLINE wsConnect #-}

wsSend :: AttributeValue -> Attribute
wsSend :: AttributeValue -> Attribute
wsSend = Tag -> Tag -> AttributeValue -> Attribute
attribute "ws-send" " ws-send=\""
{-# INLINE wsSend #-}