hnix-store-remote: Remote hnix store

[ apache, library, nix ] [ Propose Tags ] [ Report a vulnerability ]

Implementation of the nix store using the daemon protocol.


[Skip to Readme]

Flags

Automatic Flags
NameDescriptionDefault
io-testsuite

Enable testsuite, which requires external binaries and Linux namespace support.

Disabled
build-derivation

Build build-derivation executable

Disabled
build-readme

Build README.lhs example

Disabled

Use -f <flag> to enable a flag, or -f -<flag> to disable that flag. More info

Downloads

Maintainer's Corner

Package maintainers

For package maintainers and hackage trustees

Candidates

Versions [RSS] 0.1.0.0, 0.3.0.0, 0.4.0.0, 0.4.1.0, 0.4.2.0, 0.4.3.1, 0.5.0.0, 0.6.0.0, 0.7.0.0
Change log CHANGELOG.md
Dependencies aeson, attoparsec, base (>=4.12 && <5), bytestring, cereal, concurrency, containers, crypton, data-default-class, dependent-sum (>0.7), dependent-sum-template (>=0.2.0.1 && <0.3), dlist (>=1.0), exceptions, generic-arbitrary (<1.1), hashable, hnix-store-core (>=0.8 && <0.9), hnix-store-json (>=0.1), hnix-store-nar (>=0.1), hnix-store-remote, hnix-store-tests (>=0.1), mtl, network, QuickCheck, text, time, transformers, unix (>=2.7), unordered-containers, vector [details]
License Apache-2.0
Copyright 2018 Sorki
Author Sorki
Maintainer srk@48.io
Category Nix
Home page https://github.com/haskell-nix/hnix-store
Uploaded by srk at 2024-07-31T15:38:54Z
Distributions NixOS:0.6.0.0
Reverse Dependencies 1 direct, 10 indirect [details]
Executables remote-readme, build-derivation
Downloads 3189 total (55 in the last 30 days)
Rating (no votes yet) [estimated by Bayesian average]
Your Rating
  • λ
  • λ
  • λ
Status Docs available [build log]
Last success reported on 2024-07-31 [all 1 reports]

Readme for hnix-store-remote-0.7.0.0

[back to package description]

hnix-store-remote

Nix worker protocol implementation for interacting with remote Nix store via nix-daemon.

API

Example

{-# LANGUAGE OverloadedStrings #-}

import System.Nix.StorePath (mkStorePathName)
import System.Nix.Store.Remote

main :: IO ()
main = do
  runStore $ do
    syncWithGC
    roots <- findRoots

    res <- case mkStorePathName "hnix-store" of
      Left e -> error (show e)
      Right name ->
        addTextToStore
         (StoreText name "Hello World!")
         mempty
         RepairMode_DontRepair

    pure (roots, res)
  >>= print