নেকড়ে ও মুরগি


15

এখানে একটি নদী আছে এবং নদীর একপাশে নেকড়ে ও মুরগি রয়েছে। তাদের একটি ভেলা রয়েছে এবং তাদের সবারই অন্যদিকে যেতে হবে। তবে ভেলাটি নিজে থেকে ভ্রমণ করতে পারে না। এতে আরও দুটি প্রাণীর গায়ে থাকলে ভেলাটি ডুবে যাবে। নদীর শীত ও নোংরা হওয়ার কারণে কোনও প্রাণীই ভিজে যেতে চায় না। কোনও প্রাণীই নদীর উপর দিয়ে ঝাঁপ দিতে বা উড়তে পারে না। এছাড়াও, যদি একদিকে মুরগি থাকে, তবে পাশের মুরগিগুলির চেয়ে ওদিকে আরও নেকড়ে থাকতে পারে না - নেকড়েরা মুরগি খাওয়ার সিদ্ধান্ত নেবে। এর অর্থ এই যে আপনি একটি মুরগির সাথে রাফটিতে দুটি নেকড়ে নিতে পারছেন না।

আপনার কাজটি এমন একটি প্রোগ্রাম / ক্রিয়াকলাপ করা হয় যাতে বেশ কয়েকটি নেকড়ে এবং বেশ কয়েকটি মুরগি (নেকড়েদের সংখ্যার চেয়ে বড় বা সমান) নেয় এবং ভেলাটি নদীর তীরে সরে যেতে স্বল্পতম সংখ্যার সন্ধান করে। যদি কাজটি সম্ভব না হয় তবে প্রোগ্রাম / ফাংশনটি ফাঁকা স্ট্রিং আউটপুট / ফিরিয়ে দেয়। এটি নিম্নলিখিত পদ্ধতিতে এটি কীভাবে করা হয় তার একটি পদ্ধতি মুদ্রণ / ফিরিয়ে দেবে:

W if a wolf crosses the river on its own
C if a chicken crosses the river on its own
CW if a chicken and a wolf cross the river -- WC is also fine
CC if two chickens cross the river
WW if two wolves cross the river

আপনি অনুমান করতে পারেন, ভেলাটি স্বয়ংক্রিয়ভাবে বিকল্প দিকগুলিতে চলে যাবে (বাম এবং ডান, প্রথম এক বা দুটি প্রাণী নদীটি অতিক্রম করার সাথে সাথে বাম থেকে ডানে শুরু হবে)। এটি আউটপুট / রিটার্ন করার দরকার নেই। আউটপুটে 'ডাব্লু', 'সি', 'সিডাব্লু', 'সিসি' বা 'ডাব্লুডাব্লু' নিম্নোক্ত যে কোনও একটি দ্বারা পৃথক করা যেতে পারে:

spaces (' ')
commas (',')
newlines

বিকল্পভাবে, আপনি কোনও তালিকার আইটেম হিসাবে দিকনির্দেশগুলি সঞ্চয় করতে পারেন (একটি খালি তালিকার কোনও সমাধান নেই)।

পরীক্ষার কেস (আউটপুট কমা দ্বারা পৃথক - ইনপুট ফর্ম গ্রহণ করে wolves,chickens):

1,1 -> CW

2,2 -> CW,C,CC,C,CW

1,2 -> CW,W,CW

0,10 -> CC,C,CC,C,CC,C,CC,C,CC,C,CC,C,CC,C,CC,C,CC

3,2 -> no solution

আপনার কোডটি যতটা সম্ভব বাইটে সংক্ষিপ্ত করার চেষ্টা করুন।



@ কারাসোকম্পুটিং এটি কাজ করে না, কারণ মুরগির চেয়ে আরও নেকড়ে রয়েছে। সুতরাং কোন সমাধান নেই।
0WJYxW9FMN

আহ ... সম্ভবত ইনপুটগুলিকে ডাব্লু = 3, সি = 2 বা অন্য কিছু হিসাবে লেবেল করুন; প্রক্রিয়া করার জন্য একটি বিভ্রান্তিমূলক ছিল, অন্যটি এটি দুর্দান্ত দেখায়।
ম্যাজিক অক্টোপাস উরন

@ কারাসোকম্পুটিং আমি করব, তবে আমি মনে করি এটি আরও বিভ্রান্তিকর হবে কারণ ইনপুটটি ডাব্লু = 3, সি = 2 নয়।
0WJYxW9FMN

উত্তর:


5

পার্ল, 179 165 164 163 157 156 বাইট

জন্য +4 অন্তর্ভুক্ত -p

STDIN এ মুরগির পরে নেকড়ে বাঘ দিন

river.pl <<< "2 3"

প্রতি লাইনে নৌকার সামগ্রী আউটপুট দেয়। উদাহরণস্বরূপ এটি দেয়:

WC
C
CC
C
CC
W
WW

river.pl:

#!/usr/bin/perl -p
/ /;@F=w x$`.c x$'."\xaf\n";$a{$`x/\n/}++||grep(y/c//<y/w//&/c/,$_,~$_)or$\||=$' x/^\w*\n|(\w?)(.*)(c|w)(.+)\n(?{push@F,$1.$3.~"$`$2$4\xf5".uc"$'$1$3\n"})^/ for@F}{

যেমন দেখানো হয়েছে তেমন কাজ করে তবে দাবি করা স্কোরটি পাওয়ার জন্য প্রতিস্থাপন করুন \xhhএবং \nতাদের আক্ষরিক সংস্করণ দ্বারা।

এটি সম্ভবত এমন কোনও প্রোগ্রামের মাধ্যমে মারবে যা সাধারণ কেস সমাধান করে (সি> ডাব্লু> 0)

* output `WC W WC C` until there is only one wolf left on the left bank (--w, --c)
* output `CC C` until there is only one chicken left on the left bank (--c)
* output `WC`

যোগ যে শুধুমাত্র নেকড়ে এবং শুধুমাত্র মুরগি ও একটি হার্ডকোডেড বিশেষ মামলায় তুচ্ছ সমাধান 2 2এবং 3 3( 4 4এবং উচ্চতর কোন সমাধান থাকে)। তবে এটি একটি বিরক্তিকর প্রোগ্রাম হবে।

ব্যাখ্যা

ক্ষেত্রের বর্তমান অবস্থাটি একক স্ট্রিং সমন্বিত হিসাবে সংরক্ষণ করা হয়:

  • w নৌকায় পাড়ে একটি নেকড়ে জন্য
  • c নৌকায় তীরে একটি মুরগির জন্য
  • \x88(কিছুটা বিপরীত w) অন্য তীরে একটি নেকড়ে জন্য
  • \x9c(কিছুটা বিপরীত c) অন্য পাড়ে একটি মুরগির জন্য
  • বাম তীরে (প্রারম্ভিক দিকের জন্য) নৌকাটি Pডান তীরে, \xaf(বিপরীত Pদিকে) পাশের দিকে নির্দেশ করে এমন একটি চরিত্র
  • একটি নতুন লাইন \n
  • এখন পর্যন্ত সম্পন্ন সমস্ত পদক্ষেপগুলি নিউলাইনগুলি দিয়ে শেষ করা হয়েছে, উদাহরণস্বরূপ এমন কিছু WC\nW\nWC\nC\n(লক্ষ্য করুন Wএবং Cএখানে বড় হাতের অক্ষরে রয়েছে)

অ্যারেতে @Fসমস্ত অ্যাক্সেসযোগ্য রাজ্য থাকবে। এটি শুরু করার স্ট্রিং দ্বারা সূচনা করা হয়wolves times "w", chickens times "c", \xaf \n

প্রোগ্রামটি তখন লুপগুলি উপরের দিকে @Fপ্রসারিত হবে যাতে নতুন রাজ্যগুলিও প্রক্রিয়াজাত হয়। প্রতিটি উপাদানের জন্য এটি তখন করে:

  • প্রথমটির বাম অংশটি দেখুন \nযা প্রাণী এবং নৌকার বর্তমান অবস্থানকে উপস্থাপন করে। যদি তা এড়িয়ে যাওয়ার আগে দেখা যায়$a{$`x/\n/}++
  • কোনও পাশে আরও নেকড়ে একসাথে মুরগী ​​আছে কিনা তা পরীক্ষা করে দেখুন। যদি হয় তবে এড়িয়ে যানgrep(y/c//<y/w//&/c/,$_,~$_)
  • নৌকোটি সমস্ত প্রাণীর সাথে একত্রে দূরে কিনা তা পরীক্ষা করে দেখুন। যদি তাই হয় তবে আমাদের একটি সমাধান আছে। এটি সংরক্ষণ করুন $\এবং যেহেতু প্রথম সমাধানটি পাওয়া গেছে তা সবচেয়ে সংক্ষিপ্ত keep$\||=$' x/^\w*\n/
  • অন্যথায় নৌকাটি সহ পাশের 1 বা 2 টি প্রাণী বেছে নেওয়ার সমস্ত উপায় ব্যবহার করে দেখুন। এগুলি cএবং wচরিত্রগুলি। (অন্য পাশের প্রাণী মিলবে না \w) /(\w?)(.*)(c|w)(.+)\n(?{code})^/। তারপরে \nনৌকার জন্য নির্বাচিত প্রাণীদের বাদে বিট পুরো স্ট্রিংটি বিপরীত করুন push@F,$1.$3.~"$`$2$4\xf5"। নির্বাচিত প্রাণীগুলিকে বড় হাতের নাড়ি দিয়ে চলাচলে যুক্ত করুন:uc"$'$1$3\n"

প্রাণী নির্বাচন প্রক্রিয়া কার্যকরভাবে স্ট্রিং অংশটি বিভিন্ন উপায়ে তাদের উপস্থাপন করে uff সুতরাং যেমন wcwcএবং wwccউভয়ই 2 নেকড়ে এবং 2 মুরগির প্রতিনিধিত্ব করতে পারে। রাষ্ট্রীয় চেকটি $a{$`x/\n/}++নির্দ্বিধায় এই দুটি আরও আলাদা করে তুলবে প্রয়োজনের তুলনায় আরও অনেকগুলি রাজ্য উত্পন্ন এবং চেক করা হবে। সুতরাং বিভিন্ন প্রাণীর সংখ্যা বৃহত্তর হওয়ার সাথে সাথে প্রোগ্রামটি স্মৃতি ও সময়ের বাইরে চলে যাবে। সমাধানটি পাওয়া গেলে বর্তমান সংস্করণটি নতুন রাজ্য যুক্ত করা বন্ধ করে দেবে এই বিষয়টি কেবলমাত্র খানিকটা কমিয়ে আনা হয়েছে


আপনি যদি 4% বলছেন এবং উচ্চতর সমমানের গণনাগুলির সমাধান রয়েছে যেমন আমি না বুঝি তবে (4,4) = ডাব্লুসি, সি, ডাব্লু, ডাব্লু, ডাব্লু, ডাব্লু, ডাব্লু, ডাব্লু, ডাব্লু, ডাব্লু, ডাব্লু, ডাব্লু, ডাব্লু

@ ফেজ: WC,C,WCডান তীরে 2 টি নেকড়ে এবং 1 টি মুরগী ​​রয়েছে। গেম শেষ
টন হসপেল

হ্যাঁ আমার খারাপ আমি সমস্যার একটি অংশ ভুল বুঝেছি।

4

জাভাস্ক্রিপ্ট (ES6), 251 264 ... 244 240 বাইট

নেকড়ে ও মুরগির সংখ্যা নেয় এবং (w, c)সর্বোত্তম সমাধানগুলির মধ্যে একটি দেয় বা undefinedযদি এর সমাধান না থাকে।

(w,c,v={},B=1/0,S)=>(r=(s,w,c,W=0,C=0,d=1,N=0,k=w+'|'+c+d)=>v[k]|c*w>c*c|C*W>C*C|w<0|c<0|W<0|C<0?0:w|c?[v[k]=1,2,4,8,5].map(n=>r(s+'C'.repeat(b=n>>2)+'W'.repeat(a=n&3)+' ',w-d*a,c-d*b,W+d*a,C+d*b,-d,N+1))&(v[k]=0):N<B&&(B=N,S=s))('',w,c)||S

ফর্ম্যাট এবং মন্তব্য

মোড়ক ফাংশন:

(                                    // given:
  w,                                 // - w : # of wolves
  c,                                 // - c : # of chickens
  v = {},                            // - v : object keeping track of visited nodes
  B = 1 / 0,                         // - B : length of best solution
  S                                  // - S : best solution
) => (                               //
r = (...) => ...                     // process recursive calls (see below)
)('', w, c) || S                     // return the best solution

প্রধান পুনরাবৃত্তি ফাংশন:

r = (                                // given:
  s,                                 // - s : current solution (as text)
  w, c,                              // - w/c : # of chickens/wolves on the left side
  W = 0, C = 0,                      // - W/C : # of chickens/wolves on the right side
  d = 1,                             // - d : direction (1:left to right, -1:right to left)
  N = 0,                             // - N : length of current solution
  k = w + '|' + c + d                // - k : key identifying the current node
) =>                                 //
v[k] |                               // abort if this node was already visited
c * w > c * c | C * W > C * C |      // or there are more wolves than chickens somewhere
w < 0 | c < 0 | W < 0 | C < 0 ?      // or we have created antimatter animals 
  0                                  //
:                                    // else:
  w | c ?                            //   if there are still animals on the left side:
    [v[k] = 1, 2, 4, 8, 5].map(n =>  //     set node as visited and do a recursive call
      r(                             //     for each combination: W, WW, C, CC and CW
        s + 'C'.repeat(b = n >> 2) + //     append used combination to current solution
        'W'.repeat(a = n & 3) + ' ', //     wolves = bits 0-1 of n / chickens = bits 2-3
        w - d * a,                   //     update wolves on the left side
        c - d * b,                   //     update chickens on the left side
        W + d * a,                   //     update wolves on the right side
        C + d * b,                   //     update chickens on the right side
        -d,                          //     use opposite direction for the next turn
        N + 1                        //     increment length of current solution
      )                              //
    ) &                              //     once we're done,
    (v[k] = 0)                       //     set this node back to 'not visited'
  :                                  //   else:
    N < B &&                         //     save this solution if it's shorter than the
    (B = N, S = s)                   //     best solution encountered so far

পরীক্ষার মামলা


চ্যালেঞ্জ বলে and finds the smallest number of times the raft has to move across the river.। সুতরাং আমি মনে করি না এটি একটি বৈধ সমাধান
টন হসপেল

@ আরনাউল্ড ওপিকে কী উত্তর দেবেন ? আমি মনে করি এটি স্পষ্ট যে আপনাকে অবশ্যই সবচেয়ে সংক্ষিপ্ত সমাধান আউটপুট করতে হবে, অন্যকে নয়।
এরিক দি আউটগল্ফার

@ আর্নল্ড টন হসপেল ঠিক আছে।
0WJYxW9FMN

@ আর্নল্ড যদি আপনি এটি তৈরি করেন যাতে এটি অন্যান্য সমাধানগুলি মুদ্রণ না করে - কেবল সংক্ষিপ্ততম সমাধান, তবে এটি ঠিক করা উচিত।
0WJYxW9FMN

@ J843136028 আশা করি এই মুহূর্তে আমি এটি পেয়েছি। ^^
আর্নল্ড

2

সিজেম, 133

q~[0_]]_0+a:A;a{{28e3Zb2/{[YT2*(f*_Wf*]X..+:Bs'-&B2<{~_@<*},+{B2<T!+a:CA&{AC+:A;BY"WC".*a+}|}|}fY}fX]T!:T;__!\{0=:+!},e|:R!}g;R0=2>S*

এটি অনলাইনে চেষ্টা করুন

ব্যাখ্যা:

মূলত প্রোগ্রামটি একটি বিএফএস করে এবং অসীম চক্র এড়াতে যাতে পৌঁছেছে এমন প্রতিটি রাষ্ট্রের কথা মনে রাখে। কার্যকারী রাষ্ট্রগুলি [[ডাব্লুএল সিএল] এম 1 এম 2… এমএন] এর মতো প্রতিনিধিত্ব করে যেখানে ডাব্লু = নেকড়ে, সি = মুরগি, এল = বাম দিক, আর = ডান দিক, এম = চালগুলি এখনও পর্যন্ত তৈরি করা হয়েছে (প্রাথমিকভাবে কিছুই নেই), এবং চালগুলি "সি", "ডাব্লুসি" বা "ডাব্লুডাব্লু" ইত্যাদির মতো (কার্যত আরও বেশি "[" "সি"], ["ডাব্লু" "সি"], "" ডাব্লুডাব্লু "" "]] এর মতো তবে এটি একই রকম যখন মুদ্রণ)। স্মরণযোগ্য রাজ্যগুলি [[Wl Cl] [Wr Cr] S] এর মতো প্রতিনিধিত্ব করা হয় যেখানে এস বোটের পাশে (0 = বাম, 1 = ডান)।

q~                 read and evaluate the input ([Wl Cl] array)
[0_]               push [0 0] as the initial [Wr Cr] array
]_                 wrap both in an array (initial working state) and duplicate it
0+a                append 0 (representing left side) and wrap in an array
:A;                store in A and pop; this is the array of remembered states
a                  wrap the working state in an array
{…}g               do … while
  {…}fX            for each working state X
    28e3Zb2/       convert 28000 to base 3 and group the digits into pairs
                    this generates [[1 1] [0 2] [1 0] [2 0] [0 1]]
                    which are all possible moves represented as [Wb Cb] (b=boat)
    {…}fY          for each "numeric move" pair Y
      […]          make an array of…
        YT2*(f*    Y negated if T=0 (T is the current boat side, initially 0)
        _Wf*       and the (arithmetic) negation of the previous pair
      X..+         add the 2 pairs to X, element by element
                    this performs the move by adding & subtracting the numbers
                    from the appropriate sides, determined by T
      :Bs          store the updated state in B, then convert to string
      '-&          intersect with "-" to see if there was any negative number
      B2<          also get just the animal counts from B (first 2 pairs)
      {…},         filter the 2 sides by checking…
        ~_@<*      if W>C>0 (it calculates (C<W)*C)
      +            concatenate the results from the negative test and eating test
      {…}|         if it comes up empty (valid state)…
        B2<        get the animal counts from B (first 2 pairs)
        T!+        append !T (opposite side)
        a:C        wrap in an array and store in C
        A&         intersect with A to see if we already reached that state
        {…}|       if not, then…
          AC+:A;   append C to A
          BY       push B and Y (updated state and numeric move)
          "WC".*   repeat "W" and "C" the corresponding numbers of times from Y
                    to generate the alphabetic move
          a+       wrap in array and append to B (adding the current move)
  ]                collect all the derived states in an array
  T!:T;            reverse the side with the boat
  __!              make 2 copies of the state array, and check if it's empty
  \{…},            filter another copy of it, checking for each state…
    0=:+!          if the left side adds up to 0
  e|:R             logical "or" the two and store the result in R
  !                (logically) negate R, using it as a do-while condition
                    the loop ends when there are no more working states
                    or there are states with the left side empty
;                  after the loop, pop the last state array
R0=2>S*            if the problem is solved, R has solution states,
                    and this extracts the moves from the first state
                    and joins them with space
                   if there's no solution, R=1
                    and this repeats a space 0 times, resulting in empty string

0

পার্ল 6 , 268 বাইট

->*@a {(
[X](0 X..@a)[1..*-2]
.grep({![>](|$_,0)&![>](|(@a Z-$_),0)})
.combinations(2)
.combinations
.map(|*.permutations)
.map({.map(|*)»[*]})
.map({((|$_,(0,0)ZZ-@a,|$_)ZX*|(-1,1)xx*)»[*]})
.grep({.all.&{.all>=0&&3>.sum>0}})
.map({.map:{[~](<W C>Zx$_)}})
if [<=] @a
)[0]//()}

(wolf count, chicken count)বাম তীরের জন্য ক্রমবর্ধমান দীর্ঘ রাজ্যের চেইন উত্পন্ন করে এবং সমস্ত নিয়মের সাথে মেলে এমন প্রথমটি দেয়।

এই দৃষ্টিভঙ্গিটি দক্ষ বা খুব সংক্ষিপ্ত নয়, তবে এটি লিখতে মজাদার ছিল।
আমি মনে করি না আমি এর আগে এবং এখানে Z(জিপ) এবং X(ক্রস) মেটা-অপারেটরদের আগে কখনও স্ট্যাক করি নি - কিন্ডা অবাক হয়েছিল যে আসলে কাজ করেছিল।ZZ-ZX*

(নিউলাইনগুলি কেবল প্রদর্শনের উদ্দেশ্যে যুক্ত করা হয়েছে এবং এটি বাইট গণনার অংশ নয়))


0

জাভাস্ক্রিপ্ট (ES6), 227 237

মূলত এটি একটি বিএফএস করে এবং অসীম চক্র এড়াতে যাতে পৌঁছেছে এমন প্রতিটি রাষ্ট্রের কথা মনে রাখে। @ অ্যাডিটস এর বিপরীতে, আমি মনে করি না যে গল্ফ করার কোনও জায়গা নেই

v=>g=>eval("o=[],s=[[v,g,0,k=[]]];for(i=0;y=s[i++];k[y]=k[y]||['WW','C','CC','W','CW'].map((u,j)=>(r=w-(j?j/3|0:2),q=c-j%3,d=g-q,e=v-r,r<0|q<0|!!q&r>q|!!d&e>d)||s.push([e,d,!z,[...p,u]])))o=([w,c,z,p]=y,y[3]=!z|c-g|w-v)?o:i=p")

কম গল্ফড

(v,g) => {
  o = []; // output
  k = []; // hashtable to check states already seen
  s=[[v, g, 0, []]]; // states list: each element is wolves,chickens,side,path
  for(i = 0; 
      y = s[i++]; // exit loop when there are no more states to expand
     )
  {
    [w, c, z, p] = x; // wolves on this side, chickens on this side, side, path
    if (z && c==g && w==v) // if all chicken and wolves on the other side
      o = p, // the current path is the output
      i = p  // this will force the loop to terminate
    y[3] = 0; // forget the path, now I can use y as the key to check state and avoid cycles
    if (! k[y]) // it's a new state
    {
       k[y] = 1; // remember it
       ['WW','C','CC','W','CW'].map( (u,j)=> (
          a = j ? j/3|0 : 2, // wolves to move
          b = j % 3, // chicken to move  
          r = w - a, // new number of wolves on this side 
          q = c - b, // new number of chickens on this side
          e = v - r, // new number of wolves on other side
          d = g - q, // new number of chickens on other side
          // check condition about the number of animals together
          // if ok, push a new state
          r<0 |q<0 | !!q&r>q | !!d&e>d || 
            s.push([e, d, !z, [...p,u]) 
       )
    }
  }
  return o
}

পরীক্ষা

F=
v=>g=>eval("o=[],s=[[v,g,0,k=[]]];for(i=0;y=s[i++];k[y]=k[y]||['WW','C','CC','W','CW'].map((u,j)=>(r=w-(j?j/3|0:2),q=c-j%3,d=g-q,e=v-r,r<0|q<0|!!q&r>q|!!d&e>d)||s.push([e,d,!z,[...p,u]])))o=([w,c,z,p]=y,y[3]=!z|c-g|w-v)?o:i=p")

function update() {
  var c=+C.value, w=+W.value
  O.textContent=F(w)(c)
}

update()
input { width: 4em }
Chickens <input id=C value=2 type=number min=0 oninput='update()'>
Wolves <input id=W value=2 type=number min=0 oninput='update()'>
<pre id=O></pre>

আমাদের সাইট ব্যবহার করে, আপনি স্বীকার করেছেন যে আপনি আমাদের কুকি নীতি এবং গোপনীয়তা নীতিটি পড়েছেন এবং বুঝতে পেরেছেন ।
Licensed under cc by-sa 3.0 with attribution required.