Class: Gem::RequestSet::Lockfile

Inherits:
Object
  • Object
show all
Defined in:
lib/rubygems/request_set/lockfile.rb

Overview

Parses a gem.deps.rb.lock file and constructs a LockSet containing the dependencies found inside. If the lock file is missing no LockSet is constructed.

Defined Under Namespace

Classes: ParseError

Instance Attribute Summary collapse

Instance Method Summary collapse

Constructor Details

#initialize(request_set, gem_deps_file) ⇒ Lockfile

Creates a new Lockfile for the given request_set and gem_deps_file location.



52
53
54
55
56
57
58
59
60
61
62
# File 'lib/rubygems/request_set/lockfile.rb', line 52

def initialize request_set, gem_deps_file
  @set           = request_set
  @gem_deps_file = File.expand_path(gem_deps_file)
  @gem_deps_dir  = File.dirname(@gem_deps_file)

  @current_token  = nil
  @line           = 0
  @line_pos       = 0
  @platforms      = []
  @tokens         = []
end

Instance Attribute Details

#platformsObject (readonly)

The platforms for this Lockfile



46
47
48
# File 'lib/rubygems/request_set/lockfile.rb', line 46

def platforms
  @platforms
end

Instance Method Details

#add_DEPENDENCIES(out) ⇒ Object

:nodoc:



64
65
66
67
68
69
70
71
72
73
74
75
76
77
78
79
80
81
# File 'lib/rubygems/request_set/lockfile.rb', line 64

def add_DEPENDENCIES out # :nodoc:
  out << "DEPENDENCIES"

  @requests.sort_by { |r| r.name }.each do |request|
    spec = request.spec

    if [Gem::Resolver::VendorSpecification,
        Gem::Resolver::GitSpecification].include? spec.class then
      out << "  #{request.name}!"
    else
      requirement = request.request.dependency.requirement

      out << "  #{request.name}#{requirement.for_lockfile}"
    end
  end

  out << nil
end

#add_GEM(out) ⇒ Object

:nodoc:



83
84
85
86
87
88
89
90
91
92
93
94
95
96
97
98
99
100
101
102
103
104
105
106
107
108
# File 'lib/rubygems/request_set/lockfile.rb', line 83

def add_GEM out # :nodoc:
  return if @spec_groups.empty?

  source_groups = @spec_groups.values.flatten.group_by do |request|
    request.spec.source.uri
  end

  source_groups.sort_by { |group,| group.to_s }.map do |group, requests|
    out << "GEM"
    out << "  remote: #{group}"
    out << "  specs:"

    requests.sort_by { |request| request.name }.each do |request|
      platform = "-#{request.spec.platform}" unless
        Gem::Platform::RUBY == request.spec.platform

      out << "    #{request.name} (#{request.version}#{platform})"

      request.full_spec.dependencies.sort.each do |dependency|
        requirement = dependency.requirement
        out << "      #{dependency.name}#{requirement.for_lockfile}"
      end
    end
    out << nil
  end
end

#add_GIT(out) ⇒ Object



110
111
112
113
114
115
116
117
118
119
120
121
122
123
124
125
126
127
128
129
130
131
132
133
134
135
136
# File 'lib/rubygems/request_set/lockfile.rb', line 110

def add_GIT out
  return unless git_requests =
    @spec_groups.delete(Gem::Resolver::GitSpecification)

  by_repository_revision = git_requests.group_by do |request|
    source = request.spec.source
    [source.repository, source.rev_parse]
  end

  out << "GIT"
  by_repository_revision.each do |(repository, revision), requests|
    out << "  remote: #{repository}"
    out << "  revision: #{revision}"
    out << "  specs:"

    requests.sort_by { |request| request.name }.each do |request|
      out << "    #{request.name} (#{request.version})"

      dependencies = request.spec.dependencies.sort_by { |dep| dep.name }
      dependencies.each do |dep|
        out << "      #{dep.name}#{dep.requirement.for_lockfile}"
      end
    end
  end

  out << nil
end

#add_PATH(out) ⇒ Object

:nodoc:



149
150
151
152
153
154
155
156
157
158
159
160
161
162
163
# File 'lib/rubygems/request_set/lockfile.rb', line 149

def add_PATH out # :nodoc:
  return unless path_requests =
    @spec_groups.delete(Gem::Resolver::VendorSpecification)

  out << "PATH"
  path_requests.each do |request|
    directory = File.expand_path(request.spec.source.uri)

    out << "  remote: #{relative_path_from directory, @gem_deps_dir}"
    out << "  specs:"
    out << "    #{request.name} (#{request.version})"
  end

  out << nil
end

#add_PLATFORMS(out) ⇒ Object

:nodoc:



165
166
167
168
169
170
171
172
173
174
175
176
# File 'lib/rubygems/request_set/lockfile.rb', line 165

def add_PLATFORMS out # :nodoc:
  out << "PLATFORMS"

  platforms = @requests.map { |request| request.spec.platform }.uniq
  platforms.delete Gem::Platform::RUBY if platforms.length > 1

  platforms.each do |platform|
    out << "  #{platform}"
  end

  out << nil
end

#get(expected_types = nil, expected_value = nil) ⇒ Object

Gets the next token for a Lockfile



181
182
183
184
185
186
187
188
189
190
191
192
193
194
195
196
197
198
199
200
201
202
203
204
205
206
# File 'lib/rubygems/request_set/lockfile.rb', line 181

def get expected_types = nil, expected_value = nil # :nodoc:
  @current_token = @tokens.shift

  type, value, column, line = @current_token

  if expected_types and not Array(expected_types).include? type then
    unget

    message = "unexpected token [#{type.inspect}, #{value.inspect}], " +
              "expected #{expected_types.inspect}"

    raise ParseError.new message, column, line, "#{@gem_deps_file}.lock"
  end

  if expected_value and expected_value != value then
    unget

    message = "unexpected token [#{type.inspect}, #{value.inspect}], " +
              "expected [#{expected_types.inspect}, " +
              "#{expected_value.inspect}]"

    raise ParseError.new message, column, line, "#{@gem_deps_file}.lock"
  end

  @current_token
end

#parseObject

:nodoc:



208
209
210
211
212
213
214
215
216
217
218
219
220
221
222
223
224
225
226
227
228
229
230
231
232
233
234
235
236
# File 'lib/rubygems/request_set/lockfile.rb', line 208

def parse # :nodoc:
  tokenize

  until @tokens.empty? do
    type, data, column, line = get

    case type
    when :section then
      skip :newline

      case data
      when 'DEPENDENCIES' then
        parse_DEPENDENCIES
      when 'GIT' then
        parse_GIT
      when 'GEM' then
        parse_GEM
      when 'PATH' then
        parse_PATH
      when 'PLATFORMS' then
        parse_PLATFORMS
      else
        type, = get until @tokens.empty? or peek.first == :section
      end
    else
      raise "BUG: unhandled token #{type} (#{data.inspect}) at line #{line} column #{column}"
    end
  end
end

#parse_DEPENDENCIESObject

:nodoc:



238
239
240
241
242
243
244
245
246
247
248
249
250
251
252
253
254
255
256
257
258
259
260
261
262
263
264
265
266
267
268
269
270
271
272
273
274
275
276
277
# File 'lib/rubygems/request_set/lockfile.rb', line 238

def parse_DEPENDENCIES # :nodoc:
  while not @tokens.empty? and :text == peek.first do
    _, name, = get :text

    requirements = []

    case peek[0]
    when :bang then
      get :bang

      spec = @set.sets.select { |set|
        Gem::Resolver::GitSet    === set or
        Gem::Resolver::VendorSet === set
      }.map { |set|
        set.specs[name]
      }.first

      requirements << spec.version
    when :l_paren then
      get :l_paren

      loop do
        _, op,      = get :requirement
        _, version, = get :text

        requirements << "#{op} #{version}"

        break unless peek[0] == :comma

        get :comma
      end

      get :r_paren
    end

    @set.gem name, *requirements

    skip :newline
  end
end

#parse_dependency(name, op) ⇒ Object

Parses the requirements following the dependency name and the op for the first token of the requirements and returns a Gem::Dependency object.



429
430
431
432
433
434
435
436
437
438
439
440
441
442
443
444
445
# File 'lib/rubygems/request_set/lockfile.rb', line 429

def parse_dependency name, op # :nodoc:
  return Gem::Dependency.new name unless peek[0] == :text

  _, version, = get :text

  requirements = ["#{op} #{version}"]

  while peek[0] == :comma do
    get :comma
    _, op,      = get :requirement
    _, version, = get :text

    requirements << "#{op} #{version}"
  end

  Gem::Dependency.new name, requirements
end

#parse_GEMObject

:nodoc:



279
280
281
282
283
284
285
286
287
288
289
290
291
292
293
294
295
296
297
298
299
300
301
302
303
304
305
306
307
308
309
310
311
312
313
314
315
316
317
318
319
320
321
322
# File 'lib/rubygems/request_set/lockfile.rb', line 279

def parse_GEM # :nodoc:
  get :entry, 'remote'
  _, data, = get :text

  source = Gem::Source.new data

  skip :newline

  get :entry, 'specs'

  skip :newline

  set = Gem::Resolver::LockSet.new source
  last_spec = nil

  while not @tokens.empty? and :text == peek.first do
    _, name, column, = get :text

    case peek[0]
    when :newline then
      last_spec.add_dependency Gem::Dependency.new name if column == 6
    when :l_paren then
      get :l_paren

      type, data, = get [:text, :requirement]

      if type == :text and column == 4 then
        last_spec = set.add name, data, Gem::Platform::RUBY
      else
        dependency = parse_dependency name, data

        last_spec.add_dependency dependency
      end

      get :r_paren
    else
      raise "BUG: unknown token #{peek}"
    end

    skip :newline
  end

  @set.sets << set
end

#parse_GITObject

:nodoc:



324
325
326
327
328
329
330
331
332
333
334
335
336
337
338
339
340
341
342
343
344
345
346
347
348
349
350
351
352
353
354
355
356
357
358
359
360
361
362
363
364
365
366
367
368
369
370
# File 'lib/rubygems/request_set/lockfile.rb', line 324

def parse_GIT # :nodoc:
  get :entry, 'remote'
  _, repository, = get :text

  skip :newline

  get :entry, 'revision'
  _, revision, = get :text

  skip :newline

  get :entry, 'specs'

  skip :newline

  set = Gem::Resolver::GitSet.new
  last_spec = nil

  while not @tokens.empty? and :text == peek.first do
    _, name, column, = get :text

    case peek[0]
    when :newline then
      last_spec.add_dependency Gem::Dependency.new name if column == 6
    when :l_paren then
      get :l_paren

      type, data, = get [:text, :requirement]

      if type == :text and column == 4 then
        last_spec = set.add_git_spec name, data, repository, revision, true
      else
        dependency = parse_dependency name, data

        last_spec.spec.dependencies << dependency
      end

      get :r_paren
    else
      raise "BUG: unknown token #{peek}"
    end

    skip :newline
  end

  @set.sets << set
end

#parse_PATHObject

:nodoc:



372
373
374
375
376
377
378
379
380
381
382
383
384
385
386
387
388
389
390
391
392
393
394
395
396
397
398
399
400
401
402
403
404
405
406
407
408
409
410
411
412
413
# File 'lib/rubygems/request_set/lockfile.rb', line 372

def parse_PATH # :nodoc:
  get :entry, 'remote'
  _, directory, = get :text

  skip :newline

  get :entry, 'specs'

  skip :newline

  set = Gem::Resolver::VendorSet.new
  last_spec = nil

  while not @tokens.empty? and :text == peek.first do
    _, name, column, = get :text

    case peek[0]
    when :newline then
      last_spec.add_dependency Gem::Dependency.new name if column == 6
    when :l_paren then
      get :l_paren

      type, data, = get [:text, :requirement]

      if type == :text and column == 4 then
        last_spec = set.add_vendor_gem name, directory
      else
        dependency = parse_dependency name, data

        last_spec.spec.dependencies << dependency
      end

      get :r_paren
    else
      raise "BUG: unknown token #{peek}"
    end

    skip :newline
  end

  @set.sets << set
end

#parse_PLATFORMSObject

:nodoc:



415
416
417
418
419
420
421
422
423
# File 'lib/rubygems/request_set/lockfile.rb', line 415

def parse_PLATFORMS # :nodoc:
  while not @tokens.empty? and :text == peek.first do
    _, name, = get :text

    @platforms << name

    skip :newline
  end
end

#peekObject

Peeks at the next token for Lockfile



450
451
452
# File 'lib/rubygems/request_set/lockfile.rb', line 450

def peek # :nodoc:
  @tokens.first || [:EOF]
end

#relative_path_from(dest, base) ⇒ Object

:nodoc:



138
139
140
141
142
143
144
145
146
147
# File 'lib/rubygems/request_set/lockfile.rb', line 138

def relative_path_from dest, base # :nodoc:
  dest = File.expand_path(dest)
  base = File.expand_path(base)

  if dest.index(base) == 0
    return dest[base.size+1..-1]
  else
    dest
  end
end

#skip(type) ⇒ Object

:nodoc:



454
455
456
# File 'lib/rubygems/request_set/lockfile.rb', line 454

def skip type # :nodoc:
  get while not @tokens.empty? and peek.first == type
end

#to_sObject

The contents of the lock file.



461
462
463
464
465
466
467
468
469
470
471
472
473
474
475
476
477
478
479
480
481
482
483
# File 'lib/rubygems/request_set/lockfile.rb', line 461

def to_s
  @set.resolve

  out = []

  @requests = @set.sorted_requests

  @spec_groups = @requests.group_by do |request|
    request.spec.class
  end

  add_PATH out

  add_GIT out

  add_GEM out

  add_PLATFORMS out

  add_DEPENDENCIES out

  out.join "\n"
end

#token_pos(byte_offset) ⇒ Object

Calculates the column (by byte) and the line of the current token based on byte_offset.



489
490
491
# File 'lib/rubygems/request_set/lockfile.rb', line 489

def token_pos byte_offset # :nodoc:
  [byte_offset - @line_pos, @line]
end

#tokenizeObject

Converts a lock file into an Array of tokens. If the lock file is missing an empty Array is returned.



497
498
499
500
501
502
503
504
505
506
507
508
509
510
511
512
513
514
515
516
517
518
519
520
521
522
523
524
525
526
527
528
529
530
531
532
533
534
535
536
537
538
539
540
541
542
543
544
545
546
547
548
549
550
551
552
553
554
555
556
557
558
559
560
# File 'lib/rubygems/request_set/lockfile.rb', line 497

def tokenize # :nodoc:
  @line     = 0
  @line_pos = 0

  @platforms     = []
  @tokens        = []
  @current_token = nil

  lock_file = "#{@gem_deps_file}.lock"

  @input = File.read lock_file
  s      = StringScanner.new @input

  until s.eos? do
    pos = s.pos

    pos = s.pos if leading_whitespace = s.scan(/ +/)

    if s.scan(/[<|=>]{7}/) then
      message = "your #{lock_file} contains merge conflict markers"
      column, line = token_pos pos

      raise ParseError.new message, column, line, lock_file
    end

    @tokens <<
      case
      when s.scan(/\r?\n/) then
        token = [:newline, nil, *token_pos(pos)]
        @line_pos = s.pos
        @line += 1
        token
      when s.scan(/[A-Z]+/) then
        if leading_whitespace then
          text = s.matched
          text += s.scan(/[^\s)]*/).to_s # in case of no match
          [:text, text, *token_pos(pos)]
        else
          [:section, s.matched, *token_pos(pos)]
        end
      when s.scan(/([a-z]+):\s/) then
        s.pos -= 1 # rewind for possible newline
        [:entry, s[1], *token_pos(pos)]
      when s.scan(/\(/) then
        [:l_paren, nil, *token_pos(pos)]
      when s.scan(/\)/) then
        [:r_paren, nil, *token_pos(pos)]
      when s.scan(/<=|>=|=|~>|<|>|!=/) then
        [:requirement, s.matched, *token_pos(pos)]
      when s.scan(/,/) then
        [:comma, nil, *token_pos(pos)]
      when s.scan(/!/) then
        [:bang, nil, *token_pos(pos)]
      when s.scan(/[^\s),!]*/) then
        [:text, s.matched, *token_pos(pos)]
      else
        raise "BUG: can't create token for: #{s.string[s.pos..-1].inspect}"
      end
  end

  @tokens
rescue Errno::ENOENT
  @tokens
end

#ungetObject

Ungets the last token retrieved by #get



565
566
567
# File 'lib/rubygems/request_set/lockfile.rb', line 565

def unget # :nodoc:
  @tokens.unshift @current_token
end

#writeObject

Writes the lock file alongside the gem dependencies file



572
573
574
575
576
# File 'lib/rubygems/request_set/lockfile.rb', line 572

def write
  open "#{@gem_deps_file}.lock", 'w' do |io|
    io.write to_s
  end
end