module Reflex.Dom.Xhr.ResponseType where import Data.ByteString (ByteString) import Data.Text (Text) import GHCJS.DOM.Blob (Blob) data XhrResponseType = XhrResponseType_Default | XhrResponseType_ArrayBuffer | XhrResponseType_Blob | XhrResponseType_Text deriving (Int -> XhrResponseType -> ShowS [XhrResponseType] -> ShowS XhrResponseType -> String (Int -> XhrResponseType -> ShowS) -> (XhrResponseType -> String) -> ([XhrResponseType] -> ShowS) -> Show XhrResponseType forall a. (Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a $cshowsPrec :: Int -> XhrResponseType -> ShowS showsPrec :: Int -> XhrResponseType -> ShowS $cshow :: XhrResponseType -> String show :: XhrResponseType -> String $cshowList :: [XhrResponseType] -> ShowS showList :: [XhrResponseType] -> ShowS Show, ReadPrec [XhrResponseType] ReadPrec XhrResponseType Int -> ReadS XhrResponseType ReadS [XhrResponseType] (Int -> ReadS XhrResponseType) -> ReadS [XhrResponseType] -> ReadPrec XhrResponseType -> ReadPrec [XhrResponseType] -> Read XhrResponseType forall a. (Int -> ReadS a) -> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a $creadsPrec :: Int -> ReadS XhrResponseType readsPrec :: Int -> ReadS XhrResponseType $creadList :: ReadS [XhrResponseType] readList :: ReadS [XhrResponseType] $creadPrec :: ReadPrec XhrResponseType readPrec :: ReadPrec XhrResponseType $creadListPrec :: ReadPrec [XhrResponseType] readListPrec :: ReadPrec [XhrResponseType] Read, XhrResponseType -> XhrResponseType -> Bool (XhrResponseType -> XhrResponseType -> Bool) -> (XhrResponseType -> XhrResponseType -> Bool) -> Eq XhrResponseType forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a $c== :: XhrResponseType -> XhrResponseType -> Bool == :: XhrResponseType -> XhrResponseType -> Bool $c/= :: XhrResponseType -> XhrResponseType -> Bool /= :: XhrResponseType -> XhrResponseType -> Bool Eq, Eq XhrResponseType Eq XhrResponseType => (XhrResponseType -> XhrResponseType -> Ordering) -> (XhrResponseType -> XhrResponseType -> Bool) -> (XhrResponseType -> XhrResponseType -> Bool) -> (XhrResponseType -> XhrResponseType -> Bool) -> (XhrResponseType -> XhrResponseType -> Bool) -> (XhrResponseType -> XhrResponseType -> XhrResponseType) -> (XhrResponseType -> XhrResponseType -> XhrResponseType) -> Ord XhrResponseType XhrResponseType -> XhrResponseType -> Bool XhrResponseType -> XhrResponseType -> Ordering XhrResponseType -> XhrResponseType -> XhrResponseType forall a. Eq a => (a -> a -> Ordering) -> (a -> a -> Bool) -> (a -> a -> Bool) -> (a -> a -> Bool) -> (a -> a -> Bool) -> (a -> a -> a) -> (a -> a -> a) -> Ord a $ccompare :: XhrResponseType -> XhrResponseType -> Ordering compare :: XhrResponseType -> XhrResponseType -> Ordering $c< :: XhrResponseType -> XhrResponseType -> Bool < :: XhrResponseType -> XhrResponseType -> Bool $c<= :: XhrResponseType -> XhrResponseType -> Bool <= :: XhrResponseType -> XhrResponseType -> Bool $c> :: XhrResponseType -> XhrResponseType -> Bool > :: XhrResponseType -> XhrResponseType -> Bool $c>= :: XhrResponseType -> XhrResponseType -> Bool >= :: XhrResponseType -> XhrResponseType -> Bool $cmax :: XhrResponseType -> XhrResponseType -> XhrResponseType max :: XhrResponseType -> XhrResponseType -> XhrResponseType $cmin :: XhrResponseType -> XhrResponseType -> XhrResponseType min :: XhrResponseType -> XhrResponseType -> XhrResponseType Ord) data XhrResponseBody = XhrResponseBody_Default Text | XhrResponseBody_Text Text | XhrResponseBody_Blob Blob | XhrResponseBody_ArrayBuffer ByteString