{-# LANGUAGE ForeignFunctionInterface #-}
module Numeric.QD.Bits.Raw
  ( get_double_expn
  ) where

import Foreign.C (CDouble, CInt)

foreign import ccall unsafe "qd/bits.h get_double_expn" get_double_expn :: CDouble -> IO CInt