module Text.HTML5.MetaData.Schema.ViewAction where
import Text.HTML5.MetaData.Class
import Text.HTML5.MetaData.Type
import Data.Text
import Data.Typeable
import qualified Text.HTML5.MetaData.Schema.Thing
import qualified Text.HTML5.MetaData.Schema.Action
import qualified Text.HTML5.MetaData.Schema.ConsumeAction
data ViewAction = ViewAction { expectsAcceptanceOf :: ExpectsAcceptanceOf
, actionStatus :: ActionStatus
, agent :: Agent
, endTime :: EndTime
, error :: Error
, instrument :: Instrument
, location :: Location
, object :: Object
, participant :: Participant
, result :: Result
, startTime :: StartTime
, target :: Target
, additionalType :: AdditionalType
, alternateName :: AlternateName
, description :: Description
, image :: Image
, mainEntityOfPage :: MainEntityOfPage
, name :: Name
, potentialAction :: PotentialAction
, sameAs :: SameAs
, url :: Url
}
deriving (Show, Read, Eq, Typeable)
instance MetaData ViewAction where
_label = const "View Action"
_comment_plain = const "The act of consuming static visual content."
_comment = const "The act of consuming static visual content."
_url = const "http://schema.org/ViewAction"
_ancestors = const [typeOf (undefined :: Text.HTML5.MetaData.Schema.Thing.Thing)
,typeOf (undefined :: Text.HTML5.MetaData.Schema.Action.Action)
,typeOf (undefined :: Text.HTML5.MetaData.Schema.ConsumeAction.ConsumeAction)]
_subtypes = const []
_supertypes = const [typeOf (undefined :: Text.HTML5.MetaData.Schema.ConsumeAction.ConsumeAction)]