{-# LANGUAGE DerivingStrategies #-}
{-# LANGUAGE GeneralizedNewtypeDeriving #-}
{-# LANGUAGE AllowAmbiguousTypes #-}
{-# OPTIONS_HADDOCK not-home #-}
module FlatBuffers.Internal.Types where
import Data.Word
import FlatBuffers.Internal.Compiler.Display ( Display )
class IsStruct a where
structAlignmentOf :: Alignment
structSizeOf :: InlineSize
newtype InlineSize = InlineSize { unInlineSize :: Word16 }
deriving newtype (Show, Eq, Num, Enum, Ord, Real, Integral, Bounded)
newtype Alignment = Alignment { unAlignment :: Word8 }
deriving newtype (Show, Eq, Num, Enum, Ord, Real, Integral, Bounded, Display)