module Data.DOM.HTMLHeadElement
       (set'profile, get'profile, getm'profile) where
import Data.DOM.Html2
import Control.Monad
import BrownPLT.JavaScript
import Data.DOM.WBTypes
import Data.DOM.Dom
import Data.DOM.Document (createElement)
 
set'profile ::
            (Monad mn, CHTMLHeadElement zz) =>
              Expression String -> Expression zz -> mn (Expression zz)
set'profile = setjsProperty "profile"
 
get'profile ::
            (Monad mn, CHTMLHeadElement this) =>
              Expression this -> mn (Expression String)
get'profile thisp
  = do let et = undefined :: String
       let r = DotRef et (thisp /\ et) (Id et "profile")
       return r
 
getm'profile ::
             (Monad mn, CHTMLHeadElement this) =>
               Expression this -> mn (Expression String)
getm'profile = get'profile