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

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

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

-- | A Property value specification.

data PropertyValueSpecification

instance Show PropertyValueSpecification
instance Read PropertyValueSpecification
instance Eq PropertyValueSpecification
instance Typeable PropertyValueSpecification
instance MetaData PropertyValueSpecification