{-# LANGUAGE DeriveDataTypeable #-}
module Text.HTML5.MetaData.Schema.VoteAction where

--  Valid: 2016-02-03 (Schema.rdfs.org)

import Text.HTML5.MetaData.Class
import Data.Typeable

-- | The act of expressing a preference from a fixed/finite/structured set of choices/options.

data VoteAction

instance Show VoteAction
instance Read VoteAction
instance Eq VoteAction
instance Typeable VoteAction
instance MetaData VoteAction