nixpkgs-update-0.3.0: Tool for semi-automatic updating of nixpkgs repository
Safe HaskellNone
LanguageHaskell2010

NVD

Synopsis

Documentation

withVulnDB :: (Connection -> IO a) -> IO a Source #

Update the vulnerability database and run an action with a connection to it.

data Connection #

Connection to an open database.

You can use connectionHandle to gain access to the underlying http://hackage.haskell.org/package/direct-sqlite connection. This may be useful if you need to access some direct-sqlite functionality that's not exposed in the sqlite-simple API. This should be a safe thing to do although mixing both APIs is discouraged.

data CVE Source #

Instances

Instances details
Eq CVE Source # 
Instance details

Defined in CVE

Methods

(==) :: CVE -> CVE -> Bool #

(/=) :: CVE -> CVE -> Bool #

Ord CVE Source # 
Instance details

Defined in CVE

Methods

compare :: CVE -> CVE -> Ordering #

(<) :: CVE -> CVE -> Bool #

(<=) :: CVE -> CVE -> Bool #

(>) :: CVE -> CVE -> Bool #

(>=) :: CVE -> CVE -> Bool #

max :: CVE -> CVE -> CVE #

min :: CVE -> CVE -> CVE #

Show CVE Source # 
Instance details

Defined in CVE

Methods

showsPrec :: Int -> CVE -> ShowS #

show :: CVE -> String #

showList :: [CVE] -> ShowS #

FromJSON CVE Source # 
Instance details

Defined in CVE

FromRow CVE Source # 
Instance details

Defined in CVE

ToRow CVE Source # 
Instance details

Defined in CVE

Methods

toRow :: CVE -> [SQLData] #

data UTCTime #

This is the simplest representation of UTC. It consists of the day number, and a time offset from midnight. Note that if a day has a leap second added to it, it will have 86401 seconds.

Instances

Instances details
Eq UTCTime 
Instance details

Defined in Data.Time.Clock.Internal.UTCTime

Methods

(==) :: UTCTime -> UTCTime -> Bool #

(/=) :: UTCTime -> UTCTime -> Bool #

Data UTCTime 
Instance details

Defined in Data.Time.Clock.Internal.UTCTime

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> UTCTime -> c UTCTime #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c UTCTime #

toConstr :: UTCTime -> Constr #

dataTypeOf :: UTCTime -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c UTCTime) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c UTCTime) #

gmapT :: (forall b. Data b => b -> b) -> UTCTime -> UTCTime #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> UTCTime -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> UTCTime -> r #

gmapQ :: (forall d. Data d => d -> u) -> UTCTime -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> UTCTime -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> UTCTime -> m UTCTime #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> UTCTime -> m UTCTime #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> UTCTime -> m UTCTime #

Ord UTCTime 
Instance details

Defined in Data.Time.Clock.Internal.UTCTime

ToJSON UTCTime 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSONKey UTCTime 
Instance details

Defined in Data.Aeson.Types.ToJSON

FromJSON UTCTime 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSONKey UTCTime 
Instance details

Defined in Data.Aeson.Types.FromJSON

NFData UTCTime 
Instance details

Defined in Data.Time.Clock.Internal.UTCTime

Methods

rnf :: UTCTime -> () #

ToFormKey UTCTime 
Instance details

Defined in Web.Internal.FormUrlEncoded

Methods

toFormKey :: UTCTime -> Text #

FromFormKey UTCTime 
Instance details

Defined in Web.Internal.FormUrlEncoded

ToHttpApiData UTCTime
>>> toUrlPiece $ UTCTime (fromGregorian 2015 10 03) 864.5
"2015-10-03T00:14:24.5Z"
Instance details

Defined in Web.Internal.HttpApiData

FromHttpApiData UTCTime
>>> parseUrlPiece "2015-10-03T00:14:24Z" :: Either Text UTCTime
Right 2015-10-03 00:14:24 UTC
Instance details

Defined in Web.Internal.HttpApiData

FromField UTCTime 
Instance details

Defined in Database.SQLite.Simple.FromField

ToField UTCTime 
Instance details

Defined in Database.SQLite.Simple.ToField

Methods

toField :: UTCTime -> SQLData #